R version 4.4.0 alpha (2024-03-26 r86209 ucrt) 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 [15:31:44.646] plan(): Setting new future strategy stack: [15:31:44.648] List of future strategies: [15:31:44.648] 1. sequential: [15:31:44.648] - args: function (..., envir = parent.frame(), workers = "") [15:31:44.648] - tweaked: FALSE [15:31:44.648] - call: future::plan("sequential") [15:31:44.666] 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') ... [15:31:44.780] plan(): Setting new future strategy stack: [15:31:44.780] List of future strategies: [15:31:44.780] 1. sequential: [15:31:44.780] - args: function (..., envir = parent.frame(), workers = "") [15:31:44.780] - tweaked: FALSE [15:31:44.780] - call: plan(strategy) [15:31:44.794] plan(): nbrOfWorkers() = 1 - future_lapply(x, FUN = vector, ...) ... [15:31:44.794] future_lapply() ... [15:31:44.802] Number of chunks: 4 [15:31:44.802] getGlobalsAndPackagesXApply() ... [15:31:44.802] - future.globals: TRUE [15:31:44.803] getGlobalsAndPackages() ... [15:31:44.803] Searching for globals... [15:31:44.806] - globals found: [2] 'FUN', '.Internal' [15:31:44.806] Searching for globals ... DONE [15:31:44.807] Resolving globals: FALSE [15:31:44.808] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:44.811] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:44.811] - globals: [1] 'FUN' [15:31:44.812] [15:31:44.812] getGlobalsAndPackages() ... DONE [15:31:44.812] - globals found/used: [n=1] 'FUN' [15:31:44.812] - needed namespaces: [n=0] [15:31:44.812] Finding globals ... DONE [15:31:44.812] - use_args: TRUE [15:31:44.813] - Getting '...' globals ... [15:31:44.814] resolve() on list ... [15:31:44.814] recursive: 0 [15:31:44.814] length: 1 [15:31:44.814] elements: '...' [15:31:44.815] length: 0 (resolved future 1) [15:31:44.815] resolve() on list ... DONE [15:31:44.815] - '...' content: [n=1] 'length' [15:31:44.815] List of 1 [15:31:44.815] $ ...:List of 1 [15:31:44.815] ..$ length: int 2 [15:31:44.815] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:44.815] - attr(*, "where")=List of 1 [15:31:44.815] ..$ ...: [15:31:44.815] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:44.815] - attr(*, "resolved")= logi TRUE [15:31:44.815] - attr(*, "total_size")= num NA [15:31:44.819] - Getting '...' globals ... DONE [15:31:44.819] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:44.820] List of 2 [15:31:44.820] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:44.820] $ ... :List of 1 [15:31:44.820] ..$ length: int 2 [15:31:44.820] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:44.820] - attr(*, "where")=List of 2 [15:31:44.820] ..$ ...future.FUN: [15:31:44.820] ..$ ... : [15:31:44.820] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:44.820] - attr(*, "resolved")= logi FALSE [15:31:44.820] - attr(*, "total_size")= num 2240 [15:31:44.824] Packages to be attached in all futures: [n=0] [15:31:44.824] getGlobalsAndPackagesXApply() ... DONE [15:31:44.824] Number of futures (= number of chunks): 4 [15:31:44.825] Launching 4 futures (chunks) ... [15:31:44.825] Chunk #1 of 4 ... [15:31:44.825] - Finding globals in 'X' for chunk #1 ... [15:31:44.825] getGlobalsAndPackages() ... [15:31:44.826] Searching for globals... [15:31:44.826] [15:31:44.826] Searching for globals ... DONE [15:31:44.826] - globals: [0] [15:31:44.826] getGlobalsAndPackages() ... DONE [15:31:44.827] + additional globals found: [n=0] [15:31:44.827] + additional namespaces needed: [n=0] [15:31:44.827] - Finding globals in 'X' for chunk #1 ... DONE [15:31:44.827] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:44.827] - seeds: [15:31:44.828] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:44.828] getGlobalsAndPackages() ... [15:31:44.828] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:44.828] Resolving globals: FALSE [15:31:44.828] Tweak future expression to call with '...' arguments ... [15:31:44.829] { [15:31:44.829] do.call(function(...) { [15:31:44.829] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:44.829] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:44.829] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:44.829] on.exit(options(oopts), add = TRUE) [15:31:44.829] } [15:31:44.829] { [15:31:44.829] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:44.829] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:44.829] ...future.FUN(...future.X_jj, ...) [15:31:44.829] }) [15:31:44.829] } [15:31:44.829] }, args = future.call.arguments) [15:31:44.829] } [15:31:44.829] Tweak future expression to call with '...' arguments ... DONE [15:31:44.830] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:44.830] [15:31:44.830] getGlobalsAndPackages() ... DONE [15:31:44.831] run() for 'Future' ... [15:31:44.831] - state: 'created' [15:31:44.831] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:44.832] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:44.832] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:44.832] - Field: 'label' [15:31:44.833] - Field: 'local' [15:31:44.833] - Field: 'owner' [15:31:44.833] - Field: 'envir' [15:31:44.833] - Field: 'packages' [15:31:44.833] - Field: 'gc' [15:31:44.833] - Field: 'conditions' [15:31:44.834] - Field: 'expr' [15:31:44.834] - Field: 'uuid' [15:31:44.834] - Field: 'seed' [15:31:44.834] - Field: 'version' [15:31:44.834] - Field: 'result' [15:31:44.835] - Field: 'asynchronous' [15:31:44.835] - Field: 'calls' [15:31:44.835] - Field: 'globals' [15:31:44.835] - Field: 'stdout' [15:31:44.835] - Field: 'earlySignal' [15:31:44.836] - Field: 'lazy' [15:31:44.836] - Field: 'state' [15:31:44.836] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:44.836] - Launch lazy future ... [15:31:44.837] Packages needed by the future expression (n = 0): [15:31:44.837] Packages needed by future strategies (n = 0): [15:31:44.838] { [15:31:44.838] { [15:31:44.838] { [15:31:44.838] ...future.startTime <- base::Sys.time() [15:31:44.838] { [15:31:44.838] { [15:31:44.838] { [15:31:44.838] base::local({ [15:31:44.838] has_future <- base::requireNamespace("future", [15:31:44.838] quietly = TRUE) [15:31:44.838] if (has_future) { [15:31:44.838] ns <- base::getNamespace("future") [15:31:44.838] version <- ns[[".package"]][["version"]] [15:31:44.838] if (is.null(version)) [15:31:44.838] version <- utils::packageVersion("future") [15:31:44.838] } [15:31:44.838] else { [15:31:44.838] version <- NULL [15:31:44.838] } [15:31:44.838] if (!has_future || version < "1.8.0") { [15:31:44.838] info <- base::c(r_version = base::gsub("R version ", [15:31:44.838] "", base::R.version$version.string), [15:31:44.838] platform = base::sprintf("%s (%s-bit)", [15:31:44.838] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:44.838] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:44.838] "release", "version")], collapse = " "), [15:31:44.838] hostname = base::Sys.info()[["nodename"]]) [15:31:44.838] info <- base::sprintf("%s: %s", base::names(info), [15:31:44.838] info) [15:31:44.838] info <- base::paste(info, collapse = "; ") [15:31:44.838] if (!has_future) { [15:31:44.838] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:44.838] info) [15:31:44.838] } [15:31:44.838] else { [15:31:44.838] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:44.838] info, version) [15:31:44.838] } [15:31:44.838] base::stop(msg) [15:31:44.838] } [15:31:44.838] }) [15:31:44.838] } [15:31:44.838] ...future.strategy.old <- future::plan("list") [15:31:44.838] options(future.plan = NULL) [15:31:44.838] Sys.unsetenv("R_FUTURE_PLAN") [15:31:44.838] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:44.838] } [15:31:44.838] ...future.workdir <- getwd() [15:31:44.838] } [15:31:44.838] ...future.oldOptions <- base::as.list(base::.Options) [15:31:44.838] ...future.oldEnvVars <- base::Sys.getenv() [15:31:44.838] } [15:31:44.838] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:44.838] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:44.838] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:44.838] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:44.838] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:44.838] future.stdout.windows.reencode = NULL, width = 80L) [15:31:44.838] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:44.838] base::names(...future.oldOptions)) [15:31:44.838] } [15:31:44.838] if (FALSE) { [15:31:44.838] } [15:31:44.838] else { [15:31:44.838] if (TRUE) { [15:31:44.838] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:44.838] open = "w") [15:31:44.838] } [15:31:44.838] else { [15:31:44.838] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:44.838] windows = "NUL", "/dev/null"), open = "w") [15:31:44.838] } [15:31:44.838] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:44.838] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:44.838] base::sink(type = "output", split = FALSE) [15:31:44.838] base::close(...future.stdout) [15:31:44.838] }, add = TRUE) [15:31:44.838] } [15:31:44.838] ...future.frame <- base::sys.nframe() [15:31:44.838] ...future.conditions <- base::list() [15:31:44.838] ...future.rng <- base::globalenv()$.Random.seed [15:31:44.838] if (FALSE) { [15:31:44.838] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:44.838] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:44.838] } [15:31:44.838] ...future.result <- base::tryCatch({ [15:31:44.838] base::withCallingHandlers({ [15:31:44.838] ...future.value <- base::withVisible(base::local({ [15:31:44.838] do.call(function(...) { [15:31:44.838] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:44.838] if (!identical(...future.globals.maxSize.org, [15:31:44.838] ...future.globals.maxSize)) { [15:31:44.838] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:44.838] on.exit(options(oopts), add = TRUE) [15:31:44.838] } [15:31:44.838] { [15:31:44.838] lapply(seq_along(...future.elements_ii), [15:31:44.838] FUN = function(jj) { [15:31:44.838] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:44.838] ...future.FUN(...future.X_jj, ...) [15:31:44.838] }) [15:31:44.838] } [15:31:44.838] }, args = future.call.arguments) [15:31:44.838] })) [15:31:44.838] future::FutureResult(value = ...future.value$value, [15:31:44.838] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:44.838] ...future.rng), globalenv = if (FALSE) [15:31:44.838] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:44.838] ...future.globalenv.names)) [15:31:44.838] else NULL, started = ...future.startTime, version = "1.8") [15:31:44.838] }, condition = base::local({ [15:31:44.838] c <- base::c [15:31:44.838] inherits <- base::inherits [15:31:44.838] invokeRestart <- base::invokeRestart [15:31:44.838] length <- base::length [15:31:44.838] list <- base::list [15:31:44.838] seq.int <- base::seq.int [15:31:44.838] signalCondition <- base::signalCondition [15:31:44.838] sys.calls <- base::sys.calls [15:31:44.838] `[[` <- base::`[[` [15:31:44.838] `+` <- base::`+` [15:31:44.838] `<<-` <- base::`<<-` [15:31:44.838] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:44.838] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:44.838] 3L)] [15:31:44.838] } [15:31:44.838] function(cond) { [15:31:44.838] is_error <- inherits(cond, "error") [15:31:44.838] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:44.838] NULL) [15:31:44.838] if (is_error) { [15:31:44.838] sessionInformation <- function() { [15:31:44.838] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:44.838] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:44.838] search = base::search(), system = base::Sys.info()) [15:31:44.838] } [15:31:44.838] ...future.conditions[[length(...future.conditions) + [15:31:44.838] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:44.838] cond$call), session = sessionInformation(), [15:31:44.838] timestamp = base::Sys.time(), signaled = 0L) [15:31:44.838] signalCondition(cond) [15:31:44.838] } [15:31:44.838] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:44.838] "immediateCondition"))) { [15:31:44.838] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:44.838] ...future.conditions[[length(...future.conditions) + [15:31:44.838] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:44.838] if (TRUE && !signal) { [15:31:44.838] muffleCondition <- function (cond, pattern = "^muffle") [15:31:44.838] { [15:31:44.838] inherits <- base::inherits [15:31:44.838] invokeRestart <- base::invokeRestart [15:31:44.838] is.null <- base::is.null [15:31:44.838] muffled <- FALSE [15:31:44.838] if (inherits(cond, "message")) { [15:31:44.838] muffled <- grepl(pattern, "muffleMessage") [15:31:44.838] if (muffled) [15:31:44.838] invokeRestart("muffleMessage") [15:31:44.838] } [15:31:44.838] else if (inherits(cond, "warning")) { [15:31:44.838] muffled <- grepl(pattern, "muffleWarning") [15:31:44.838] if (muffled) [15:31:44.838] invokeRestart("muffleWarning") [15:31:44.838] } [15:31:44.838] else if (inherits(cond, "condition")) { [15:31:44.838] if (!is.null(pattern)) { [15:31:44.838] computeRestarts <- base::computeRestarts [15:31:44.838] grepl <- base::grepl [15:31:44.838] restarts <- computeRestarts(cond) [15:31:44.838] for (restart in restarts) { [15:31:44.838] name <- restart$name [15:31:44.838] if (is.null(name)) [15:31:44.838] next [15:31:44.838] if (!grepl(pattern, name)) [15:31:44.838] next [15:31:44.838] invokeRestart(restart) [15:31:44.838] muffled <- TRUE [15:31:44.838] break [15:31:44.838] } [15:31:44.838] } [15:31:44.838] } [15:31:44.838] invisible(muffled) [15:31:44.838] } [15:31:44.838] muffleCondition(cond, pattern = "^muffle") [15:31:44.838] } [15:31:44.838] } [15:31:44.838] else { [15:31:44.838] if (TRUE) { [15:31:44.838] muffleCondition <- function (cond, pattern = "^muffle") [15:31:44.838] { [15:31:44.838] inherits <- base::inherits [15:31:44.838] invokeRestart <- base::invokeRestart [15:31:44.838] is.null <- base::is.null [15:31:44.838] muffled <- FALSE [15:31:44.838] if (inherits(cond, "message")) { [15:31:44.838] muffled <- grepl(pattern, "muffleMessage") [15:31:44.838] if (muffled) [15:31:44.838] invokeRestart("muffleMessage") [15:31:44.838] } [15:31:44.838] else if (inherits(cond, "warning")) { [15:31:44.838] muffled <- grepl(pattern, "muffleWarning") [15:31:44.838] if (muffled) [15:31:44.838] invokeRestart("muffleWarning") [15:31:44.838] } [15:31:44.838] else if (inherits(cond, "condition")) { [15:31:44.838] if (!is.null(pattern)) { [15:31:44.838] computeRestarts <- base::computeRestarts [15:31:44.838] grepl <- base::grepl [15:31:44.838] restarts <- computeRestarts(cond) [15:31:44.838] for (restart in restarts) { [15:31:44.838] name <- restart$name [15:31:44.838] if (is.null(name)) [15:31:44.838] next [15:31:44.838] if (!grepl(pattern, name)) [15:31:44.838] next [15:31:44.838] invokeRestart(restart) [15:31:44.838] muffled <- TRUE [15:31:44.838] break [15:31:44.838] } [15:31:44.838] } [15:31:44.838] } [15:31:44.838] invisible(muffled) [15:31:44.838] } [15:31:44.838] muffleCondition(cond, pattern = "^muffle") [15:31:44.838] } [15:31:44.838] } [15:31:44.838] } [15:31:44.838] })) [15:31:44.838] }, error = function(ex) { [15:31:44.838] base::structure(base::list(value = NULL, visible = NULL, [15:31:44.838] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:44.838] ...future.rng), started = ...future.startTime, [15:31:44.838] finished = Sys.time(), session_uuid = NA_character_, [15:31:44.838] version = "1.8"), class = "FutureResult") [15:31:44.838] }, finally = { [15:31:44.838] if (!identical(...future.workdir, getwd())) [15:31:44.838] setwd(...future.workdir) [15:31:44.838] { [15:31:44.838] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:44.838] ...future.oldOptions$nwarnings <- NULL [15:31:44.838] } [15:31:44.838] base::options(...future.oldOptions) [15:31:44.838] if (.Platform$OS.type == "windows") { [15:31:44.838] old_names <- names(...future.oldEnvVars) [15:31:44.838] envs <- base::Sys.getenv() [15:31:44.838] names <- names(envs) [15:31:44.838] common <- intersect(names, old_names) [15:31:44.838] added <- setdiff(names, old_names) [15:31:44.838] removed <- setdiff(old_names, names) [15:31:44.838] changed <- common[...future.oldEnvVars[common] != [15:31:44.838] envs[common]] [15:31:44.838] NAMES <- toupper(changed) [15:31:44.838] args <- list() [15:31:44.838] for (kk in seq_along(NAMES)) { [15:31:44.838] name <- changed[[kk]] [15:31:44.838] NAME <- NAMES[[kk]] [15:31:44.838] if (name != NAME && is.element(NAME, old_names)) [15:31:44.838] next [15:31:44.838] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:44.838] } [15:31:44.838] NAMES <- toupper(added) [15:31:44.838] for (kk in seq_along(NAMES)) { [15:31:44.838] name <- added[[kk]] [15:31:44.838] NAME <- NAMES[[kk]] [15:31:44.838] if (name != NAME && is.element(NAME, old_names)) [15:31:44.838] next [15:31:44.838] args[[name]] <- "" [15:31:44.838] } [15:31:44.838] NAMES <- toupper(removed) [15:31:44.838] for (kk in seq_along(NAMES)) { [15:31:44.838] name <- removed[[kk]] [15:31:44.838] NAME <- NAMES[[kk]] [15:31:44.838] if (name != NAME && is.element(NAME, old_names)) [15:31:44.838] next [15:31:44.838] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:44.838] } [15:31:44.838] if (length(args) > 0) [15:31:44.838] base::do.call(base::Sys.setenv, args = args) [15:31:44.838] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:44.838] } [15:31:44.838] else { [15:31:44.838] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:44.838] } [15:31:44.838] { [15:31:44.838] if (base::length(...future.futureOptionsAdded) > [15:31:44.838] 0L) { [15:31:44.838] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:44.838] base::names(opts) <- ...future.futureOptionsAdded [15:31:44.838] base::options(opts) [15:31:44.838] } [15:31:44.838] { [15:31:44.838] { [15:31:44.838] NULL [15:31:44.838] RNGkind("Mersenne-Twister") [15:31:44.838] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:44.838] inherits = FALSE) [15:31:44.838] } [15:31:44.838] options(future.plan = NULL) [15:31:44.838] if (is.na(NA_character_)) [15:31:44.838] Sys.unsetenv("R_FUTURE_PLAN") [15:31:44.838] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:44.838] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:44.838] .init = FALSE) [15:31:44.838] } [15:31:44.838] } [15:31:44.838] } [15:31:44.838] }) [15:31:44.838] if (TRUE) { [15:31:44.838] base::sink(type = "output", split = FALSE) [15:31:44.838] if (TRUE) { [15:31:44.838] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:44.838] } [15:31:44.838] else { [15:31:44.838] ...future.result["stdout"] <- base::list(NULL) [15:31:44.838] } [15:31:44.838] base::close(...future.stdout) [15:31:44.838] ...future.stdout <- NULL [15:31:44.838] } [15:31:44.838] ...future.result$conditions <- ...future.conditions [15:31:44.838] ...future.result$finished <- base::Sys.time() [15:31:44.838] ...future.result [15:31:44.838] } [15:31:44.843] assign_globals() ... [15:31:44.843] List of 5 [15:31:44.843] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:44.843] $ future.call.arguments :List of 1 [15:31:44.843] ..$ length: int 2 [15:31:44.843] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:44.843] $ ...future.elements_ii :List of 1 [15:31:44.843] ..$ a: chr "integer" [15:31:44.843] $ ...future.seeds_ii : NULL [15:31:44.843] $ ...future.globals.maxSize: NULL [15:31:44.843] - attr(*, "where")=List of 5 [15:31:44.843] ..$ ...future.FUN : [15:31:44.843] ..$ future.call.arguments : [15:31:44.843] ..$ ...future.elements_ii : [15:31:44.843] ..$ ...future.seeds_ii : [15:31:44.843] ..$ ...future.globals.maxSize: [15:31:44.843] - attr(*, "resolved")= logi FALSE [15:31:44.843] - attr(*, "total_size")= num 2240 [15:31:44.843] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:44.843] - attr(*, "already-done")= logi TRUE [15:31:44.852] - copied '...future.FUN' to environment [15:31:44.852] - copied 'future.call.arguments' to environment [15:31:44.852] - copied '...future.elements_ii' to environment [15:31:44.852] - copied '...future.seeds_ii' to environment [15:31:44.853] - copied '...future.globals.maxSize' to environment [15:31:44.853] assign_globals() ... done [15:31:44.853] plan(): Setting new future strategy stack: [15:31:44.854] List of future strategies: [15:31:44.854] 1. sequential: [15:31:44.854] - args: function (..., envir = parent.frame(), workers = "") [15:31:44.854] - tweaked: FALSE [15:31:44.854] - call: NULL [15:31:44.854] plan(): nbrOfWorkers() = 1 [15:31:44.856] plan(): Setting new future strategy stack: [15:31:44.857] List of future strategies: [15:31:44.857] 1. sequential: [15:31:44.857] - args: function (..., envir = parent.frame(), workers = "") [15:31:44.857] - tweaked: FALSE [15:31:44.857] - call: plan(strategy) [15:31:44.857] plan(): nbrOfWorkers() = 1 [15:31:44.858] SequentialFuture started (and completed) [15:31:44.858] - Launch lazy future ... done [15:31:44.858] run() for 'SequentialFuture' ... done [15:31:44.859] Created future: [15:31:44.859] SequentialFuture: [15:31:44.859] Label: 'future_lapply-1' [15:31:44.859] Expression: [15:31:44.859] { [15:31:44.859] do.call(function(...) { [15:31:44.859] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:44.859] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:44.859] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:44.859] on.exit(options(oopts), add = TRUE) [15:31:44.859] } [15:31:44.859] { [15:31:44.859] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:44.859] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:44.859] ...future.FUN(...future.X_jj, ...) [15:31:44.859] }) [15:31:44.859] } [15:31:44.859] }, args = future.call.arguments) [15:31:44.859] } [15:31:44.859] Lazy evaluation: FALSE [15:31:44.859] Asynchronous evaluation: FALSE [15:31:44.859] Local evaluation: TRUE [15:31:44.859] Environment: R_GlobalEnv [15:31:44.859] Capture standard output: TRUE [15:31:44.859] Capture condition classes: 'condition' (excluding 'nothing') [15:31:44.859] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:44.859] Packages: [15:31:44.859] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:44.859] Resolved: TRUE [15:31:44.859] Value: 56 bytes of class 'list' [15:31:44.859] Early signaling: FALSE [15:31:44.859] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:44.859] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:44.862] Chunk #1 of 4 ... DONE [15:31:44.862] Chunk #2 of 4 ... [15:31:44.862] - Finding globals in 'X' for chunk #2 ... [15:31:44.863] getGlobalsAndPackages() ... [15:31:44.863] Searching for globals... [15:31:44.864] [15:31:44.864] Searching for globals ... DONE [15:31:44.864] - globals: [0] [15:31:44.864] getGlobalsAndPackages() ... DONE [15:31:44.865] + additional globals found: [n=0] [15:31:44.865] + additional namespaces needed: [n=0] [15:31:44.865] - Finding globals in 'X' for chunk #2 ... DONE [15:31:44.866] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:44.866] - seeds: [15:31:44.866] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:44.866] getGlobalsAndPackages() ... [15:31:44.867] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:44.867] Resolving globals: FALSE [15:31:44.867] Tweak future expression to call with '...' arguments ... [15:31:44.868] { [15:31:44.868] do.call(function(...) { [15:31:44.868] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:44.868] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:44.868] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:44.868] on.exit(options(oopts), add = TRUE) [15:31:44.868] } [15:31:44.868] { [15:31:44.868] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:44.868] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:44.868] ...future.FUN(...future.X_jj, ...) [15:31:44.868] }) [15:31:44.868] } [15:31:44.868] }, args = future.call.arguments) [15:31:44.868] } [15:31:44.868] Tweak future expression to call with '...' arguments ... DONE [15:31:44.869] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:44.870] [15:31:44.870] getGlobalsAndPackages() ... DONE [15:31:44.871] run() for 'Future' ... [15:31:44.871] - state: 'created' [15:31:44.871] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:44.872] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:44.872] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:44.873] - Field: 'label' [15:31:44.873] - Field: 'local' [15:31:44.873] - Field: 'owner' [15:31:44.873] - Field: 'envir' [15:31:44.874] - Field: 'packages' [15:31:44.874] - Field: 'gc' [15:31:44.874] - Field: 'conditions' [15:31:44.875] - Field: 'expr' [15:31:44.875] - Field: 'uuid' [15:31:44.875] - Field: 'seed' [15:31:44.876] - Field: 'version' [15:31:44.876] - Field: 'result' [15:31:44.876] - Field: 'asynchronous' [15:31:44.877] - Field: 'calls' [15:31:44.877] - Field: 'globals' [15:31:44.877] - Field: 'stdout' [15:31:44.878] - Field: 'earlySignal' [15:31:44.878] - Field: 'lazy' [15:31:44.878] - Field: 'state' [15:31:44.878] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:44.879] - Launch lazy future ... [15:31:44.879] Packages needed by the future expression (n = 0): [15:31:44.880] Packages needed by future strategies (n = 0): [15:31:44.881] { [15:31:44.881] { [15:31:44.881] { [15:31:44.881] ...future.startTime <- base::Sys.time() [15:31:44.881] { [15:31:44.881] { [15:31:44.881] { [15:31:44.881] base::local({ [15:31:44.881] has_future <- base::requireNamespace("future", [15:31:44.881] quietly = TRUE) [15:31:44.881] if (has_future) { [15:31:44.881] ns <- base::getNamespace("future") [15:31:44.881] version <- ns[[".package"]][["version"]] [15:31:44.881] if (is.null(version)) [15:31:44.881] version <- utils::packageVersion("future") [15:31:44.881] } [15:31:44.881] else { [15:31:44.881] version <- NULL [15:31:44.881] } [15:31:44.881] if (!has_future || version < "1.8.0") { [15:31:44.881] info <- base::c(r_version = base::gsub("R version ", [15:31:44.881] "", base::R.version$version.string), [15:31:44.881] platform = base::sprintf("%s (%s-bit)", [15:31:44.881] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:44.881] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:44.881] "release", "version")], collapse = " "), [15:31:44.881] hostname = base::Sys.info()[["nodename"]]) [15:31:44.881] info <- base::sprintf("%s: %s", base::names(info), [15:31:44.881] info) [15:31:44.881] info <- base::paste(info, collapse = "; ") [15:31:44.881] if (!has_future) { [15:31:44.881] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:44.881] info) [15:31:44.881] } [15:31:44.881] else { [15:31:44.881] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:44.881] info, version) [15:31:44.881] } [15:31:44.881] base::stop(msg) [15:31:44.881] } [15:31:44.881] }) [15:31:44.881] } [15:31:44.881] ...future.strategy.old <- future::plan("list") [15:31:44.881] options(future.plan = NULL) [15:31:44.881] Sys.unsetenv("R_FUTURE_PLAN") [15:31:44.881] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:44.881] } [15:31:44.881] ...future.workdir <- getwd() [15:31:44.881] } [15:31:44.881] ...future.oldOptions <- base::as.list(base::.Options) [15:31:44.881] ...future.oldEnvVars <- base::Sys.getenv() [15:31:44.881] } [15:31:44.881] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:44.881] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:44.881] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:44.881] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:44.881] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:44.881] future.stdout.windows.reencode = NULL, width = 80L) [15:31:44.881] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:44.881] base::names(...future.oldOptions)) [15:31:44.881] } [15:31:44.881] if (FALSE) { [15:31:44.881] } [15:31:44.881] else { [15:31:44.881] if (TRUE) { [15:31:44.881] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:44.881] open = "w") [15:31:44.881] } [15:31:44.881] else { [15:31:44.881] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:44.881] windows = "NUL", "/dev/null"), open = "w") [15:31:44.881] } [15:31:44.881] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:44.881] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:44.881] base::sink(type = "output", split = FALSE) [15:31:44.881] base::close(...future.stdout) [15:31:44.881] }, add = TRUE) [15:31:44.881] } [15:31:44.881] ...future.frame <- base::sys.nframe() [15:31:44.881] ...future.conditions <- base::list() [15:31:44.881] ...future.rng <- base::globalenv()$.Random.seed [15:31:44.881] if (FALSE) { [15:31:44.881] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:44.881] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:44.881] } [15:31:44.881] ...future.result <- base::tryCatch({ [15:31:44.881] base::withCallingHandlers({ [15:31:44.881] ...future.value <- base::withVisible(base::local({ [15:31:44.881] do.call(function(...) { [15:31:44.881] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:44.881] if (!identical(...future.globals.maxSize.org, [15:31:44.881] ...future.globals.maxSize)) { [15:31:44.881] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:44.881] on.exit(options(oopts), add = TRUE) [15:31:44.881] } [15:31:44.881] { [15:31:44.881] lapply(seq_along(...future.elements_ii), [15:31:44.881] FUN = function(jj) { [15:31:44.881] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:44.881] ...future.FUN(...future.X_jj, ...) [15:31:44.881] }) [15:31:44.881] } [15:31:44.881] }, args = future.call.arguments) [15:31:44.881] })) [15:31:44.881] future::FutureResult(value = ...future.value$value, [15:31:44.881] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:44.881] ...future.rng), globalenv = if (FALSE) [15:31:44.881] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:44.881] ...future.globalenv.names)) [15:31:44.881] else NULL, started = ...future.startTime, version = "1.8") [15:31:44.881] }, condition = base::local({ [15:31:44.881] c <- base::c [15:31:44.881] inherits <- base::inherits [15:31:44.881] invokeRestart <- base::invokeRestart [15:31:44.881] length <- base::length [15:31:44.881] list <- base::list [15:31:44.881] seq.int <- base::seq.int [15:31:44.881] signalCondition <- base::signalCondition [15:31:44.881] sys.calls <- base::sys.calls [15:31:44.881] `[[` <- base::`[[` [15:31:44.881] `+` <- base::`+` [15:31:44.881] `<<-` <- base::`<<-` [15:31:44.881] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:44.881] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:44.881] 3L)] [15:31:44.881] } [15:31:44.881] function(cond) { [15:31:44.881] is_error <- inherits(cond, "error") [15:31:44.881] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:44.881] NULL) [15:31:44.881] if (is_error) { [15:31:44.881] sessionInformation <- function() { [15:31:44.881] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:44.881] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:44.881] search = base::search(), system = base::Sys.info()) [15:31:44.881] } [15:31:44.881] ...future.conditions[[length(...future.conditions) + [15:31:44.881] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:44.881] cond$call), session = sessionInformation(), [15:31:44.881] timestamp = base::Sys.time(), signaled = 0L) [15:31:44.881] signalCondition(cond) [15:31:44.881] } [15:31:44.881] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:44.881] "immediateCondition"))) { [15:31:44.881] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:44.881] ...future.conditions[[length(...future.conditions) + [15:31:44.881] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:44.881] if (TRUE && !signal) { [15:31:44.881] muffleCondition <- function (cond, pattern = "^muffle") [15:31:44.881] { [15:31:44.881] inherits <- base::inherits [15:31:44.881] invokeRestart <- base::invokeRestart [15:31:44.881] is.null <- base::is.null [15:31:44.881] muffled <- FALSE [15:31:44.881] if (inherits(cond, "message")) { [15:31:44.881] muffled <- grepl(pattern, "muffleMessage") [15:31:44.881] if (muffled) [15:31:44.881] invokeRestart("muffleMessage") [15:31:44.881] } [15:31:44.881] else if (inherits(cond, "warning")) { [15:31:44.881] muffled <- grepl(pattern, "muffleWarning") [15:31:44.881] if (muffled) [15:31:44.881] invokeRestart("muffleWarning") [15:31:44.881] } [15:31:44.881] else if (inherits(cond, "condition")) { [15:31:44.881] if (!is.null(pattern)) { [15:31:44.881] computeRestarts <- base::computeRestarts [15:31:44.881] grepl <- base::grepl [15:31:44.881] restarts <- computeRestarts(cond) [15:31:44.881] for (restart in restarts) { [15:31:44.881] name <- restart$name [15:31:44.881] if (is.null(name)) [15:31:44.881] next [15:31:44.881] if (!grepl(pattern, name)) [15:31:44.881] next [15:31:44.881] invokeRestart(restart) [15:31:44.881] muffled <- TRUE [15:31:44.881] break [15:31:44.881] } [15:31:44.881] } [15:31:44.881] } [15:31:44.881] invisible(muffled) [15:31:44.881] } [15:31:44.881] muffleCondition(cond, pattern = "^muffle") [15:31:44.881] } [15:31:44.881] } [15:31:44.881] else { [15:31:44.881] if (TRUE) { [15:31:44.881] muffleCondition <- function (cond, pattern = "^muffle") [15:31:44.881] { [15:31:44.881] inherits <- base::inherits [15:31:44.881] invokeRestart <- base::invokeRestart [15:31:44.881] is.null <- base::is.null [15:31:44.881] muffled <- FALSE [15:31:44.881] if (inherits(cond, "message")) { [15:31:44.881] muffled <- grepl(pattern, "muffleMessage") [15:31:44.881] if (muffled) [15:31:44.881] invokeRestart("muffleMessage") [15:31:44.881] } [15:31:44.881] else if (inherits(cond, "warning")) { [15:31:44.881] muffled <- grepl(pattern, "muffleWarning") [15:31:44.881] if (muffled) [15:31:44.881] invokeRestart("muffleWarning") [15:31:44.881] } [15:31:44.881] else if (inherits(cond, "condition")) { [15:31:44.881] if (!is.null(pattern)) { [15:31:44.881] computeRestarts <- base::computeRestarts [15:31:44.881] grepl <- base::grepl [15:31:44.881] restarts <- computeRestarts(cond) [15:31:44.881] for (restart in restarts) { [15:31:44.881] name <- restart$name [15:31:44.881] if (is.null(name)) [15:31:44.881] next [15:31:44.881] if (!grepl(pattern, name)) [15:31:44.881] next [15:31:44.881] invokeRestart(restart) [15:31:44.881] muffled <- TRUE [15:31:44.881] break [15:31:44.881] } [15:31:44.881] } [15:31:44.881] } [15:31:44.881] invisible(muffled) [15:31:44.881] } [15:31:44.881] muffleCondition(cond, pattern = "^muffle") [15:31:44.881] } [15:31:44.881] } [15:31:44.881] } [15:31:44.881] })) [15:31:44.881] }, error = function(ex) { [15:31:44.881] base::structure(base::list(value = NULL, visible = NULL, [15:31:44.881] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:44.881] ...future.rng), started = ...future.startTime, [15:31:44.881] finished = Sys.time(), session_uuid = NA_character_, [15:31:44.881] version = "1.8"), class = "FutureResult") [15:31:44.881] }, finally = { [15:31:44.881] if (!identical(...future.workdir, getwd())) [15:31:44.881] setwd(...future.workdir) [15:31:44.881] { [15:31:44.881] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:44.881] ...future.oldOptions$nwarnings <- NULL [15:31:44.881] } [15:31:44.881] base::options(...future.oldOptions) [15:31:44.881] if (.Platform$OS.type == "windows") { [15:31:44.881] old_names <- names(...future.oldEnvVars) [15:31:44.881] envs <- base::Sys.getenv() [15:31:44.881] names <- names(envs) [15:31:44.881] common <- intersect(names, old_names) [15:31:44.881] added <- setdiff(names, old_names) [15:31:44.881] removed <- setdiff(old_names, names) [15:31:44.881] changed <- common[...future.oldEnvVars[common] != [15:31:44.881] envs[common]] [15:31:44.881] NAMES <- toupper(changed) [15:31:44.881] args <- list() [15:31:44.881] for (kk in seq_along(NAMES)) { [15:31:44.881] name <- changed[[kk]] [15:31:44.881] NAME <- NAMES[[kk]] [15:31:44.881] if (name != NAME && is.element(NAME, old_names)) [15:31:44.881] next [15:31:44.881] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:44.881] } [15:31:44.881] NAMES <- toupper(added) [15:31:44.881] for (kk in seq_along(NAMES)) { [15:31:44.881] name <- added[[kk]] [15:31:44.881] NAME <- NAMES[[kk]] [15:31:44.881] if (name != NAME && is.element(NAME, old_names)) [15:31:44.881] next [15:31:44.881] args[[name]] <- "" [15:31:44.881] } [15:31:44.881] NAMES <- toupper(removed) [15:31:44.881] for (kk in seq_along(NAMES)) { [15:31:44.881] name <- removed[[kk]] [15:31:44.881] NAME <- NAMES[[kk]] [15:31:44.881] if (name != NAME && is.element(NAME, old_names)) [15:31:44.881] next [15:31:44.881] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:44.881] } [15:31:44.881] if (length(args) > 0) [15:31:44.881] base::do.call(base::Sys.setenv, args = args) [15:31:44.881] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:44.881] } [15:31:44.881] else { [15:31:44.881] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:44.881] } [15:31:44.881] { [15:31:44.881] if (base::length(...future.futureOptionsAdded) > [15:31:44.881] 0L) { [15:31:44.881] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:44.881] base::names(opts) <- ...future.futureOptionsAdded [15:31:44.881] base::options(opts) [15:31:44.881] } [15:31:44.881] { [15:31:44.881] { [15:31:44.881] NULL [15:31:44.881] RNGkind("Mersenne-Twister") [15:31:44.881] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:44.881] inherits = FALSE) [15:31:44.881] } [15:31:44.881] options(future.plan = NULL) [15:31:44.881] if (is.na(NA_character_)) [15:31:44.881] Sys.unsetenv("R_FUTURE_PLAN") [15:31:44.881] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:44.881] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:44.881] .init = FALSE) [15:31:44.881] } [15:31:44.881] } [15:31:44.881] } [15:31:44.881] }) [15:31:44.881] if (TRUE) { [15:31:44.881] base::sink(type = "output", split = FALSE) [15:31:44.881] if (TRUE) { [15:31:44.881] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:44.881] } [15:31:44.881] else { [15:31:44.881] ...future.result["stdout"] <- base::list(NULL) [15:31:44.881] } [15:31:44.881] base::close(...future.stdout) [15:31:44.881] ...future.stdout <- NULL [15:31:44.881] } [15:31:44.881] ...future.result$conditions <- ...future.conditions [15:31:44.881] ...future.result$finished <- base::Sys.time() [15:31:44.881] ...future.result [15:31:44.881] } [15:31:44.888] assign_globals() ... [15:31:44.888] List of 5 [15:31:44.888] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:44.888] $ future.call.arguments :List of 1 [15:31:44.888] ..$ length: int 2 [15:31:44.888] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:44.888] $ ...future.elements_ii :List of 1 [15:31:44.888] ..$ b: chr "numeric" [15:31:44.888] $ ...future.seeds_ii : NULL [15:31:44.888] $ ...future.globals.maxSize: NULL [15:31:44.888] - attr(*, "where")=List of 5 [15:31:44.888] ..$ ...future.FUN : [15:31:44.888] ..$ future.call.arguments : [15:31:44.888] ..$ ...future.elements_ii : [15:31:44.888] ..$ ...future.seeds_ii : [15:31:44.888] ..$ ...future.globals.maxSize: [15:31:44.888] - attr(*, "resolved")= logi FALSE [15:31:44.888] - attr(*, "total_size")= num 2240 [15:31:44.888] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:44.888] - attr(*, "already-done")= logi TRUE [15:31:44.902] - copied '...future.FUN' to environment [15:31:44.902] - copied 'future.call.arguments' to environment [15:31:44.902] - copied '...future.elements_ii' to environment [15:31:44.903] - copied '...future.seeds_ii' to environment [15:31:44.903] - copied '...future.globals.maxSize' to environment [15:31:44.903] assign_globals() ... done [15:31:44.904] plan(): Setting new future strategy stack: [15:31:44.904] List of future strategies: [15:31:44.904] 1. sequential: [15:31:44.904] - args: function (..., envir = parent.frame(), workers = "") [15:31:44.904] - tweaked: FALSE [15:31:44.904] - call: NULL [15:31:44.905] plan(): nbrOfWorkers() = 1 [15:31:44.907] plan(): Setting new future strategy stack: [15:31:44.908] List of future strategies: [15:31:44.908] 1. sequential: [15:31:44.908] - args: function (..., envir = parent.frame(), workers = "") [15:31:44.908] - tweaked: FALSE [15:31:44.908] - call: plan(strategy) [15:31:44.909] plan(): nbrOfWorkers() = 1 [15:31:44.909] SequentialFuture started (and completed) [15:31:44.909] - Launch lazy future ... done [15:31:44.910] run() for 'SequentialFuture' ... done [15:31:44.910] Created future: [15:31:44.910] SequentialFuture: [15:31:44.910] Label: 'future_lapply-2' [15:31:44.910] Expression: [15:31:44.910] { [15:31:44.910] do.call(function(...) { [15:31:44.910] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:44.910] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:44.910] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:44.910] on.exit(options(oopts), add = TRUE) [15:31:44.910] } [15:31:44.910] { [15:31:44.910] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:44.910] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:44.910] ...future.FUN(...future.X_jj, ...) [15:31:44.910] }) [15:31:44.910] } [15:31:44.910] }, args = future.call.arguments) [15:31:44.910] } [15:31:44.910] Lazy evaluation: FALSE [15:31:44.910] Asynchronous evaluation: FALSE [15:31:44.910] Local evaluation: TRUE [15:31:44.910] Environment: R_GlobalEnv [15:31:44.910] Capture standard output: TRUE [15:31:44.910] Capture condition classes: 'condition' (excluding 'nothing') [15:31:44.910] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:44.910] Packages: [15:31:44.910] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:44.910] Resolved: TRUE [15:31:44.910] Value: 64 bytes of class 'list' [15:31:44.910] Early signaling: FALSE [15:31:44.910] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:44.910] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:44.913] Chunk #2 of 4 ... DONE [15:31:44.913] Chunk #3 of 4 ... [15:31:44.913] - Finding globals in 'X' for chunk #3 ... [15:31:44.914] getGlobalsAndPackages() ... [15:31:44.914] Searching for globals... [15:31:44.914] [15:31:44.915] Searching for globals ... DONE [15:31:44.915] - globals: [0] [15:31:44.915] getGlobalsAndPackages() ... DONE [15:31:44.916] + additional globals found: [n=0] [15:31:44.916] + additional namespaces needed: [n=0] [15:31:44.916] - Finding globals in 'X' for chunk #3 ... DONE [15:31:44.916] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:44.917] - seeds: [15:31:44.917] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:44.917] getGlobalsAndPackages() ... [15:31:44.918] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:44.918] Resolving globals: FALSE [15:31:44.918] Tweak future expression to call with '...' arguments ... [15:31:44.919] { [15:31:44.919] do.call(function(...) { [15:31:44.919] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:44.919] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:44.919] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:44.919] on.exit(options(oopts), add = TRUE) [15:31:44.919] } [15:31:44.919] { [15:31:44.919] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:44.919] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:44.919] ...future.FUN(...future.X_jj, ...) [15:31:44.919] }) [15:31:44.919] } [15:31:44.919] }, args = future.call.arguments) [15:31:44.919] } [15:31:44.920] Tweak future expression to call with '...' arguments ... DONE [15:31:44.920] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:44.921] [15:31:44.921] getGlobalsAndPackages() ... DONE [15:31:44.922] run() for 'Future' ... [15:31:44.922] - state: 'created' [15:31:44.922] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:44.923] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:44.923] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:44.924] - Field: 'label' [15:31:44.924] - Field: 'local' [15:31:44.924] - Field: 'owner' [15:31:44.925] - Field: 'envir' [15:31:44.925] - Field: 'packages' [15:31:44.925] - Field: 'gc' [15:31:44.926] - Field: 'conditions' [15:31:44.926] - Field: 'expr' [15:31:44.926] - Field: 'uuid' [15:31:44.927] - Field: 'seed' [15:31:44.927] - Field: 'version' [15:31:44.927] - Field: 'result' [15:31:44.928] - Field: 'asynchronous' [15:31:44.928] - Field: 'calls' [15:31:44.928] - Field: 'globals' [15:31:44.929] - Field: 'stdout' [15:31:44.929] - Field: 'earlySignal' [15:31:44.929] - Field: 'lazy' [15:31:44.930] - Field: 'state' [15:31:44.930] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:44.930] - Launch lazy future ... [15:31:44.931] Packages needed by the future expression (n = 0): [15:31:44.931] Packages needed by future strategies (n = 0): [15:31:44.932] { [15:31:44.932] { [15:31:44.932] { [15:31:44.932] ...future.startTime <- base::Sys.time() [15:31:44.932] { [15:31:44.932] { [15:31:44.932] { [15:31:44.932] base::local({ [15:31:44.932] has_future <- base::requireNamespace("future", [15:31:44.932] quietly = TRUE) [15:31:44.932] if (has_future) { [15:31:44.932] ns <- base::getNamespace("future") [15:31:44.932] version <- ns[[".package"]][["version"]] [15:31:44.932] if (is.null(version)) [15:31:44.932] version <- utils::packageVersion("future") [15:31:44.932] } [15:31:44.932] else { [15:31:44.932] version <- NULL [15:31:44.932] } [15:31:44.932] if (!has_future || version < "1.8.0") { [15:31:44.932] info <- base::c(r_version = base::gsub("R version ", [15:31:44.932] "", base::R.version$version.string), [15:31:44.932] platform = base::sprintf("%s (%s-bit)", [15:31:44.932] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:44.932] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:44.932] "release", "version")], collapse = " "), [15:31:44.932] hostname = base::Sys.info()[["nodename"]]) [15:31:44.932] info <- base::sprintf("%s: %s", base::names(info), [15:31:44.932] info) [15:31:44.932] info <- base::paste(info, collapse = "; ") [15:31:44.932] if (!has_future) { [15:31:44.932] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:44.932] info) [15:31:44.932] } [15:31:44.932] else { [15:31:44.932] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:44.932] info, version) [15:31:44.932] } [15:31:44.932] base::stop(msg) [15:31:44.932] } [15:31:44.932] }) [15:31:44.932] } [15:31:44.932] ...future.strategy.old <- future::plan("list") [15:31:44.932] options(future.plan = NULL) [15:31:44.932] Sys.unsetenv("R_FUTURE_PLAN") [15:31:44.932] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:44.932] } [15:31:44.932] ...future.workdir <- getwd() [15:31:44.932] } [15:31:44.932] ...future.oldOptions <- base::as.list(base::.Options) [15:31:44.932] ...future.oldEnvVars <- base::Sys.getenv() [15:31:44.932] } [15:31:44.932] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:44.932] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:44.932] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:44.932] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:44.932] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:44.932] future.stdout.windows.reencode = NULL, width = 80L) [15:31:44.932] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:44.932] base::names(...future.oldOptions)) [15:31:44.932] } [15:31:44.932] if (FALSE) { [15:31:44.932] } [15:31:44.932] else { [15:31:44.932] if (TRUE) { [15:31:44.932] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:44.932] open = "w") [15:31:44.932] } [15:31:44.932] else { [15:31:44.932] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:44.932] windows = "NUL", "/dev/null"), open = "w") [15:31:44.932] } [15:31:44.932] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:44.932] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:44.932] base::sink(type = "output", split = FALSE) [15:31:44.932] base::close(...future.stdout) [15:31:44.932] }, add = TRUE) [15:31:44.932] } [15:31:44.932] ...future.frame <- base::sys.nframe() [15:31:44.932] ...future.conditions <- base::list() [15:31:44.932] ...future.rng <- base::globalenv()$.Random.seed [15:31:44.932] if (FALSE) { [15:31:44.932] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:44.932] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:44.932] } [15:31:44.932] ...future.result <- base::tryCatch({ [15:31:44.932] base::withCallingHandlers({ [15:31:44.932] ...future.value <- base::withVisible(base::local({ [15:31:44.932] do.call(function(...) { [15:31:44.932] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:44.932] if (!identical(...future.globals.maxSize.org, [15:31:44.932] ...future.globals.maxSize)) { [15:31:44.932] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:44.932] on.exit(options(oopts), add = TRUE) [15:31:44.932] } [15:31:44.932] { [15:31:44.932] lapply(seq_along(...future.elements_ii), [15:31:44.932] FUN = function(jj) { [15:31:44.932] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:44.932] ...future.FUN(...future.X_jj, ...) [15:31:44.932] }) [15:31:44.932] } [15:31:44.932] }, args = future.call.arguments) [15:31:44.932] })) [15:31:44.932] future::FutureResult(value = ...future.value$value, [15:31:44.932] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:44.932] ...future.rng), globalenv = if (FALSE) [15:31:44.932] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:44.932] ...future.globalenv.names)) [15:31:44.932] else NULL, started = ...future.startTime, version = "1.8") [15:31:44.932] }, condition = base::local({ [15:31:44.932] c <- base::c [15:31:44.932] inherits <- base::inherits [15:31:44.932] invokeRestart <- base::invokeRestart [15:31:44.932] length <- base::length [15:31:44.932] list <- base::list [15:31:44.932] seq.int <- base::seq.int [15:31:44.932] signalCondition <- base::signalCondition [15:31:44.932] sys.calls <- base::sys.calls [15:31:44.932] `[[` <- base::`[[` [15:31:44.932] `+` <- base::`+` [15:31:44.932] `<<-` <- base::`<<-` [15:31:44.932] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:44.932] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:44.932] 3L)] [15:31:44.932] } [15:31:44.932] function(cond) { [15:31:44.932] is_error <- inherits(cond, "error") [15:31:44.932] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:44.932] NULL) [15:31:44.932] if (is_error) { [15:31:44.932] sessionInformation <- function() { [15:31:44.932] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:44.932] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:44.932] search = base::search(), system = base::Sys.info()) [15:31:44.932] } [15:31:44.932] ...future.conditions[[length(...future.conditions) + [15:31:44.932] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:44.932] cond$call), session = sessionInformation(), [15:31:44.932] timestamp = base::Sys.time(), signaled = 0L) [15:31:44.932] signalCondition(cond) [15:31:44.932] } [15:31:44.932] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:44.932] "immediateCondition"))) { [15:31:44.932] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:44.932] ...future.conditions[[length(...future.conditions) + [15:31:44.932] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:44.932] if (TRUE && !signal) { [15:31:44.932] muffleCondition <- function (cond, pattern = "^muffle") [15:31:44.932] { [15:31:44.932] inherits <- base::inherits [15:31:44.932] invokeRestart <- base::invokeRestart [15:31:44.932] is.null <- base::is.null [15:31:44.932] muffled <- FALSE [15:31:44.932] if (inherits(cond, "message")) { [15:31:44.932] muffled <- grepl(pattern, "muffleMessage") [15:31:44.932] if (muffled) [15:31:44.932] invokeRestart("muffleMessage") [15:31:44.932] } [15:31:44.932] else if (inherits(cond, "warning")) { [15:31:44.932] muffled <- grepl(pattern, "muffleWarning") [15:31:44.932] if (muffled) [15:31:44.932] invokeRestart("muffleWarning") [15:31:44.932] } [15:31:44.932] else if (inherits(cond, "condition")) { [15:31:44.932] if (!is.null(pattern)) { [15:31:44.932] computeRestarts <- base::computeRestarts [15:31:44.932] grepl <- base::grepl [15:31:44.932] restarts <- computeRestarts(cond) [15:31:44.932] for (restart in restarts) { [15:31:44.932] name <- restart$name [15:31:44.932] if (is.null(name)) [15:31:44.932] next [15:31:44.932] if (!grepl(pattern, name)) [15:31:44.932] next [15:31:44.932] invokeRestart(restart) [15:31:44.932] muffled <- TRUE [15:31:44.932] break [15:31:44.932] } [15:31:44.932] } [15:31:44.932] } [15:31:44.932] invisible(muffled) [15:31:44.932] } [15:31:44.932] muffleCondition(cond, pattern = "^muffle") [15:31:44.932] } [15:31:44.932] } [15:31:44.932] else { [15:31:44.932] if (TRUE) { [15:31:44.932] muffleCondition <- function (cond, pattern = "^muffle") [15:31:44.932] { [15:31:44.932] inherits <- base::inherits [15:31:44.932] invokeRestart <- base::invokeRestart [15:31:44.932] is.null <- base::is.null [15:31:44.932] muffled <- FALSE [15:31:44.932] if (inherits(cond, "message")) { [15:31:44.932] muffled <- grepl(pattern, "muffleMessage") [15:31:44.932] if (muffled) [15:31:44.932] invokeRestart("muffleMessage") [15:31:44.932] } [15:31:44.932] else if (inherits(cond, "warning")) { [15:31:44.932] muffled <- grepl(pattern, "muffleWarning") [15:31:44.932] if (muffled) [15:31:44.932] invokeRestart("muffleWarning") [15:31:44.932] } [15:31:44.932] else if (inherits(cond, "condition")) { [15:31:44.932] if (!is.null(pattern)) { [15:31:44.932] computeRestarts <- base::computeRestarts [15:31:44.932] grepl <- base::grepl [15:31:44.932] restarts <- computeRestarts(cond) [15:31:44.932] for (restart in restarts) { [15:31:44.932] name <- restart$name [15:31:44.932] if (is.null(name)) [15:31:44.932] next [15:31:44.932] if (!grepl(pattern, name)) [15:31:44.932] next [15:31:44.932] invokeRestart(restart) [15:31:44.932] muffled <- TRUE [15:31:44.932] break [15:31:44.932] } [15:31:44.932] } [15:31:44.932] } [15:31:44.932] invisible(muffled) [15:31:44.932] } [15:31:44.932] muffleCondition(cond, pattern = "^muffle") [15:31:44.932] } [15:31:44.932] } [15:31:44.932] } [15:31:44.932] })) [15:31:44.932] }, error = function(ex) { [15:31:44.932] base::structure(base::list(value = NULL, visible = NULL, [15:31:44.932] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:44.932] ...future.rng), started = ...future.startTime, [15:31:44.932] finished = Sys.time(), session_uuid = NA_character_, [15:31:44.932] version = "1.8"), class = "FutureResult") [15:31:44.932] }, finally = { [15:31:44.932] if (!identical(...future.workdir, getwd())) [15:31:44.932] setwd(...future.workdir) [15:31:44.932] { [15:31:44.932] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:44.932] ...future.oldOptions$nwarnings <- NULL [15:31:44.932] } [15:31:44.932] base::options(...future.oldOptions) [15:31:44.932] if (.Platform$OS.type == "windows") { [15:31:44.932] old_names <- names(...future.oldEnvVars) [15:31:44.932] envs <- base::Sys.getenv() [15:31:44.932] names <- names(envs) [15:31:44.932] common <- intersect(names, old_names) [15:31:44.932] added <- setdiff(names, old_names) [15:31:44.932] removed <- setdiff(old_names, names) [15:31:44.932] changed <- common[...future.oldEnvVars[common] != [15:31:44.932] envs[common]] [15:31:44.932] NAMES <- toupper(changed) [15:31:44.932] args <- list() [15:31:44.932] for (kk in seq_along(NAMES)) { [15:31:44.932] name <- changed[[kk]] [15:31:44.932] NAME <- NAMES[[kk]] [15:31:44.932] if (name != NAME && is.element(NAME, old_names)) [15:31:44.932] next [15:31:44.932] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:44.932] } [15:31:44.932] NAMES <- toupper(added) [15:31:44.932] for (kk in seq_along(NAMES)) { [15:31:44.932] name <- added[[kk]] [15:31:44.932] NAME <- NAMES[[kk]] [15:31:44.932] if (name != NAME && is.element(NAME, old_names)) [15:31:44.932] next [15:31:44.932] args[[name]] <- "" [15:31:44.932] } [15:31:44.932] NAMES <- toupper(removed) [15:31:44.932] for (kk in seq_along(NAMES)) { [15:31:44.932] name <- removed[[kk]] [15:31:44.932] NAME <- NAMES[[kk]] [15:31:44.932] if (name != NAME && is.element(NAME, old_names)) [15:31:44.932] next [15:31:44.932] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:44.932] } [15:31:44.932] if (length(args) > 0) [15:31:44.932] base::do.call(base::Sys.setenv, args = args) [15:31:44.932] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:44.932] } [15:31:44.932] else { [15:31:44.932] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:44.932] } [15:31:44.932] { [15:31:44.932] if (base::length(...future.futureOptionsAdded) > [15:31:44.932] 0L) { [15:31:44.932] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:44.932] base::names(opts) <- ...future.futureOptionsAdded [15:31:44.932] base::options(opts) [15:31:44.932] } [15:31:44.932] { [15:31:44.932] { [15:31:44.932] NULL [15:31:44.932] RNGkind("Mersenne-Twister") [15:31:44.932] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:44.932] inherits = FALSE) [15:31:44.932] } [15:31:44.932] options(future.plan = NULL) [15:31:44.932] if (is.na(NA_character_)) [15:31:44.932] Sys.unsetenv("R_FUTURE_PLAN") [15:31:44.932] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:44.932] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:44.932] .init = FALSE) [15:31:44.932] } [15:31:44.932] } [15:31:44.932] } [15:31:44.932] }) [15:31:44.932] if (TRUE) { [15:31:44.932] base::sink(type = "output", split = FALSE) [15:31:44.932] if (TRUE) { [15:31:44.932] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:44.932] } [15:31:44.932] else { [15:31:44.932] ...future.result["stdout"] <- base::list(NULL) [15:31:44.932] } [15:31:44.932] base::close(...future.stdout) [15:31:44.932] ...future.stdout <- NULL [15:31:44.932] } [15:31:44.932] ...future.result$conditions <- ...future.conditions [15:31:44.932] ...future.result$finished <- base::Sys.time() [15:31:44.932] ...future.result [15:31:44.932] } [15:31:44.939] assign_globals() ... [15:31:44.939] List of 5 [15:31:44.939] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:44.939] $ future.call.arguments :List of 1 [15:31:44.939] ..$ length: int 2 [15:31:44.939] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:44.939] $ ...future.elements_ii :List of 1 [15:31:44.939] ..$ c: chr "character" [15:31:44.939] $ ...future.seeds_ii : NULL [15:31:44.939] $ ...future.globals.maxSize: NULL [15:31:44.939] - attr(*, "where")=List of 5 [15:31:44.939] ..$ ...future.FUN : [15:31:44.939] ..$ future.call.arguments : [15:31:44.939] ..$ ...future.elements_ii : [15:31:44.939] ..$ ...future.seeds_ii : [15:31:44.939] ..$ ...future.globals.maxSize: [15:31:44.939] - attr(*, "resolved")= logi FALSE [15:31:44.939] - attr(*, "total_size")= num 2240 [15:31:44.939] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:44.939] - attr(*, "already-done")= logi TRUE [15:31:44.950] - copied '...future.FUN' to environment [15:31:44.950] - copied 'future.call.arguments' to environment [15:31:44.950] - copied '...future.elements_ii' to environment [15:31:44.953] - copied '...future.seeds_ii' to environment [15:31:44.953] - copied '...future.globals.maxSize' to environment [15:31:44.954] assign_globals() ... done [15:31:44.954] plan(): Setting new future strategy stack: [15:31:44.955] List of future strategies: [15:31:44.955] 1. sequential: [15:31:44.955] - args: function (..., envir = parent.frame(), workers = "") [15:31:44.955] - tweaked: FALSE [15:31:44.955] - call: NULL [15:31:44.956] plan(): nbrOfWorkers() = 1 [15:31:44.958] plan(): Setting new future strategy stack: [15:31:44.958] List of future strategies: [15:31:44.958] 1. sequential: [15:31:44.958] - args: function (..., envir = parent.frame(), workers = "") [15:31:44.958] - tweaked: FALSE [15:31:44.958] - call: plan(strategy) [15:31:44.959] plan(): nbrOfWorkers() = 1 [15:31:44.959] SequentialFuture started (and completed) [15:31:44.960] - Launch lazy future ... done [15:31:44.960] run() for 'SequentialFuture' ... done [15:31:44.960] Created future: [15:31:44.961] SequentialFuture: [15:31:44.961] Label: 'future_lapply-3' [15:31:44.961] Expression: [15:31:44.961] { [15:31:44.961] do.call(function(...) { [15:31:44.961] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:44.961] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:44.961] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:44.961] on.exit(options(oopts), add = TRUE) [15:31:44.961] } [15:31:44.961] { [15:31:44.961] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:44.961] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:44.961] ...future.FUN(...future.X_jj, ...) [15:31:44.961] }) [15:31:44.961] } [15:31:44.961] }, args = future.call.arguments) [15:31:44.961] } [15:31:44.961] Lazy evaluation: FALSE [15:31:44.961] Asynchronous evaluation: FALSE [15:31:44.961] Local evaluation: TRUE [15:31:44.961] Environment: R_GlobalEnv [15:31:44.961] Capture standard output: TRUE [15:31:44.961] Capture condition classes: 'condition' (excluding 'nothing') [15:31:44.961] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 120 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:44.961] Packages: [15:31:44.961] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:44.961] Resolved: TRUE [15:31:44.961] Value: 120 bytes of class 'list' [15:31:44.961] Early signaling: FALSE [15:31:44.961] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:44.961] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:44.963] Chunk #3 of 4 ... DONE [15:31:44.963] Chunk #4 of 4 ... [15:31:44.964] - Finding globals in 'X' for chunk #4 ... [15:31:44.964] getGlobalsAndPackages() ... [15:31:44.964] Searching for globals... [15:31:44.965] [15:31:44.965] Searching for globals ... DONE [15:31:44.965] - globals: [0] [15:31:44.966] getGlobalsAndPackages() ... DONE [15:31:44.966] + additional globals found: [n=0] [15:31:44.966] + additional namespaces needed: [n=0] [15:31:44.966] - Finding globals in 'X' for chunk #4 ... DONE [15:31:44.967] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:44.967] - seeds: [15:31:44.967] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:44.968] getGlobalsAndPackages() ... [15:31:44.968] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:44.968] Resolving globals: FALSE [15:31:44.969] Tweak future expression to call with '...' arguments ... [15:31:44.969] { [15:31:44.969] do.call(function(...) { [15:31:44.969] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:44.969] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:44.969] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:44.969] on.exit(options(oopts), add = TRUE) [15:31:44.969] } [15:31:44.969] { [15:31:44.969] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:44.969] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:44.969] ...future.FUN(...future.X_jj, ...) [15:31:44.969] }) [15:31:44.969] } [15:31:44.969] }, args = future.call.arguments) [15:31:44.969] } [15:31:44.970] Tweak future expression to call with '...' arguments ... DONE [15:31:44.971] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:44.971] [15:31:44.971] getGlobalsAndPackages() ... DONE [15:31:44.972] run() for 'Future' ... [15:31:44.972] - state: 'created' [15:31:44.973] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:44.973] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:44.974] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:44.974] - Field: 'label' [15:31:44.974] - Field: 'local' [15:31:44.975] - Field: 'owner' [15:31:44.975] - Field: 'envir' [15:31:44.975] - Field: 'packages' [15:31:44.976] - Field: 'gc' [15:31:44.976] - Field: 'conditions' [15:31:44.976] - Field: 'expr' [15:31:44.976] - Field: 'uuid' [15:31:44.977] - Field: 'seed' [15:31:44.977] - Field: 'version' [15:31:44.977] - Field: 'result' [15:31:44.978] - Field: 'asynchronous' [15:31:44.978] - Field: 'calls' [15:31:44.978] - Field: 'globals' [15:31:44.979] - Field: 'stdout' [15:31:44.979] - Field: 'earlySignal' [15:31:44.979] - Field: 'lazy' [15:31:44.980] - Field: 'state' [15:31:44.980] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:44.980] - Launch lazy future ... [15:31:44.981] Packages needed by the future expression (n = 0): [15:31:44.981] Packages needed by future strategies (n = 0): [15:31:44.982] { [15:31:44.982] { [15:31:44.982] { [15:31:44.982] ...future.startTime <- base::Sys.time() [15:31:44.982] { [15:31:44.982] { [15:31:44.982] { [15:31:44.982] base::local({ [15:31:44.982] has_future <- base::requireNamespace("future", [15:31:44.982] quietly = TRUE) [15:31:44.982] if (has_future) { [15:31:44.982] ns <- base::getNamespace("future") [15:31:44.982] version <- ns[[".package"]][["version"]] [15:31:44.982] if (is.null(version)) [15:31:44.982] version <- utils::packageVersion("future") [15:31:44.982] } [15:31:44.982] else { [15:31:44.982] version <- NULL [15:31:44.982] } [15:31:44.982] if (!has_future || version < "1.8.0") { [15:31:44.982] info <- base::c(r_version = base::gsub("R version ", [15:31:44.982] "", base::R.version$version.string), [15:31:44.982] platform = base::sprintf("%s (%s-bit)", [15:31:44.982] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:44.982] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:44.982] "release", "version")], collapse = " "), [15:31:44.982] hostname = base::Sys.info()[["nodename"]]) [15:31:44.982] info <- base::sprintf("%s: %s", base::names(info), [15:31:44.982] info) [15:31:44.982] info <- base::paste(info, collapse = "; ") [15:31:44.982] if (!has_future) { [15:31:44.982] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:44.982] info) [15:31:44.982] } [15:31:44.982] else { [15:31:44.982] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:44.982] info, version) [15:31:44.982] } [15:31:44.982] base::stop(msg) [15:31:44.982] } [15:31:44.982] }) [15:31:44.982] } [15:31:44.982] ...future.strategy.old <- future::plan("list") [15:31:44.982] options(future.plan = NULL) [15:31:44.982] Sys.unsetenv("R_FUTURE_PLAN") [15:31:44.982] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:44.982] } [15:31:44.982] ...future.workdir <- getwd() [15:31:44.982] } [15:31:44.982] ...future.oldOptions <- base::as.list(base::.Options) [15:31:44.982] ...future.oldEnvVars <- base::Sys.getenv() [15:31:44.982] } [15:31:44.982] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:44.982] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:44.982] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:44.982] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:44.982] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:44.982] future.stdout.windows.reencode = NULL, width = 80L) [15:31:44.982] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:44.982] base::names(...future.oldOptions)) [15:31:44.982] } [15:31:44.982] if (FALSE) { [15:31:44.982] } [15:31:44.982] else { [15:31:44.982] if (TRUE) { [15:31:44.982] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:44.982] open = "w") [15:31:44.982] } [15:31:44.982] else { [15:31:44.982] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:44.982] windows = "NUL", "/dev/null"), open = "w") [15:31:44.982] } [15:31:44.982] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:44.982] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:44.982] base::sink(type = "output", split = FALSE) [15:31:44.982] base::close(...future.stdout) [15:31:44.982] }, add = TRUE) [15:31:44.982] } [15:31:44.982] ...future.frame <- base::sys.nframe() [15:31:44.982] ...future.conditions <- base::list() [15:31:44.982] ...future.rng <- base::globalenv()$.Random.seed [15:31:44.982] if (FALSE) { [15:31:44.982] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:44.982] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:44.982] } [15:31:44.982] ...future.result <- base::tryCatch({ [15:31:44.982] base::withCallingHandlers({ [15:31:44.982] ...future.value <- base::withVisible(base::local({ [15:31:44.982] do.call(function(...) { [15:31:44.982] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:44.982] if (!identical(...future.globals.maxSize.org, [15:31:44.982] ...future.globals.maxSize)) { [15:31:44.982] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:44.982] on.exit(options(oopts), add = TRUE) [15:31:44.982] } [15:31:44.982] { [15:31:44.982] lapply(seq_along(...future.elements_ii), [15:31:44.982] FUN = function(jj) { [15:31:44.982] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:44.982] ...future.FUN(...future.X_jj, ...) [15:31:44.982] }) [15:31:44.982] } [15:31:44.982] }, args = future.call.arguments) [15:31:44.982] })) [15:31:44.982] future::FutureResult(value = ...future.value$value, [15:31:44.982] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:44.982] ...future.rng), globalenv = if (FALSE) [15:31:44.982] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:44.982] ...future.globalenv.names)) [15:31:44.982] else NULL, started = ...future.startTime, version = "1.8") [15:31:44.982] }, condition = base::local({ [15:31:44.982] c <- base::c [15:31:44.982] inherits <- base::inherits [15:31:44.982] invokeRestart <- base::invokeRestart [15:31:44.982] length <- base::length [15:31:44.982] list <- base::list [15:31:44.982] seq.int <- base::seq.int [15:31:44.982] signalCondition <- base::signalCondition [15:31:44.982] sys.calls <- base::sys.calls [15:31:44.982] `[[` <- base::`[[` [15:31:44.982] `+` <- base::`+` [15:31:44.982] `<<-` <- base::`<<-` [15:31:44.982] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:44.982] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:44.982] 3L)] [15:31:44.982] } [15:31:44.982] function(cond) { [15:31:44.982] is_error <- inherits(cond, "error") [15:31:44.982] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:44.982] NULL) [15:31:44.982] if (is_error) { [15:31:44.982] sessionInformation <- function() { [15:31:44.982] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:44.982] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:44.982] search = base::search(), system = base::Sys.info()) [15:31:44.982] } [15:31:44.982] ...future.conditions[[length(...future.conditions) + [15:31:44.982] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:44.982] cond$call), session = sessionInformation(), [15:31:44.982] timestamp = base::Sys.time(), signaled = 0L) [15:31:44.982] signalCondition(cond) [15:31:44.982] } [15:31:44.982] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:44.982] "immediateCondition"))) { [15:31:44.982] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:44.982] ...future.conditions[[length(...future.conditions) + [15:31:44.982] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:44.982] if (TRUE && !signal) { [15:31:44.982] muffleCondition <- function (cond, pattern = "^muffle") [15:31:44.982] { [15:31:44.982] inherits <- base::inherits [15:31:44.982] invokeRestart <- base::invokeRestart [15:31:44.982] is.null <- base::is.null [15:31:44.982] muffled <- FALSE [15:31:44.982] if (inherits(cond, "message")) { [15:31:44.982] muffled <- grepl(pattern, "muffleMessage") [15:31:44.982] if (muffled) [15:31:44.982] invokeRestart("muffleMessage") [15:31:44.982] } [15:31:44.982] else if (inherits(cond, "warning")) { [15:31:44.982] muffled <- grepl(pattern, "muffleWarning") [15:31:44.982] if (muffled) [15:31:44.982] invokeRestart("muffleWarning") [15:31:44.982] } [15:31:44.982] else if (inherits(cond, "condition")) { [15:31:44.982] if (!is.null(pattern)) { [15:31:44.982] computeRestarts <- base::computeRestarts [15:31:44.982] grepl <- base::grepl [15:31:44.982] restarts <- computeRestarts(cond) [15:31:44.982] for (restart in restarts) { [15:31:44.982] name <- restart$name [15:31:44.982] if (is.null(name)) [15:31:44.982] next [15:31:44.982] if (!grepl(pattern, name)) [15:31:44.982] next [15:31:44.982] invokeRestart(restart) [15:31:44.982] muffled <- TRUE [15:31:44.982] break [15:31:44.982] } [15:31:44.982] } [15:31:44.982] } [15:31:44.982] invisible(muffled) [15:31:44.982] } [15:31:44.982] muffleCondition(cond, pattern = "^muffle") [15:31:44.982] } [15:31:44.982] } [15:31:44.982] else { [15:31:44.982] if (TRUE) { [15:31:44.982] muffleCondition <- function (cond, pattern = "^muffle") [15:31:44.982] { [15:31:44.982] inherits <- base::inherits [15:31:44.982] invokeRestart <- base::invokeRestart [15:31:44.982] is.null <- base::is.null [15:31:44.982] muffled <- FALSE [15:31:44.982] if (inherits(cond, "message")) { [15:31:44.982] muffled <- grepl(pattern, "muffleMessage") [15:31:44.982] if (muffled) [15:31:44.982] invokeRestart("muffleMessage") [15:31:44.982] } [15:31:44.982] else if (inherits(cond, "warning")) { [15:31:44.982] muffled <- grepl(pattern, "muffleWarning") [15:31:44.982] if (muffled) [15:31:44.982] invokeRestart("muffleWarning") [15:31:44.982] } [15:31:44.982] else if (inherits(cond, "condition")) { [15:31:44.982] if (!is.null(pattern)) { [15:31:44.982] computeRestarts <- base::computeRestarts [15:31:44.982] grepl <- base::grepl [15:31:44.982] restarts <- computeRestarts(cond) [15:31:44.982] for (restart in restarts) { [15:31:44.982] name <- restart$name [15:31:44.982] if (is.null(name)) [15:31:44.982] next [15:31:44.982] if (!grepl(pattern, name)) [15:31:44.982] next [15:31:44.982] invokeRestart(restart) [15:31:44.982] muffled <- TRUE [15:31:44.982] break [15:31:44.982] } [15:31:44.982] } [15:31:44.982] } [15:31:44.982] invisible(muffled) [15:31:44.982] } [15:31:44.982] muffleCondition(cond, pattern = "^muffle") [15:31:44.982] } [15:31:44.982] } [15:31:44.982] } [15:31:44.982] })) [15:31:44.982] }, error = function(ex) { [15:31:44.982] base::structure(base::list(value = NULL, visible = NULL, [15:31:44.982] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:44.982] ...future.rng), started = ...future.startTime, [15:31:44.982] finished = Sys.time(), session_uuid = NA_character_, [15:31:44.982] version = "1.8"), class = "FutureResult") [15:31:44.982] }, finally = { [15:31:44.982] if (!identical(...future.workdir, getwd())) [15:31:44.982] setwd(...future.workdir) [15:31:44.982] { [15:31:44.982] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:44.982] ...future.oldOptions$nwarnings <- NULL [15:31:44.982] } [15:31:44.982] base::options(...future.oldOptions) [15:31:44.982] if (.Platform$OS.type == "windows") { [15:31:44.982] old_names <- names(...future.oldEnvVars) [15:31:44.982] envs <- base::Sys.getenv() [15:31:44.982] names <- names(envs) [15:31:44.982] common <- intersect(names, old_names) [15:31:44.982] added <- setdiff(names, old_names) [15:31:44.982] removed <- setdiff(old_names, names) [15:31:44.982] changed <- common[...future.oldEnvVars[common] != [15:31:44.982] envs[common]] [15:31:44.982] NAMES <- toupper(changed) [15:31:44.982] args <- list() [15:31:44.982] for (kk in seq_along(NAMES)) { [15:31:44.982] name <- changed[[kk]] [15:31:44.982] NAME <- NAMES[[kk]] [15:31:44.982] if (name != NAME && is.element(NAME, old_names)) [15:31:44.982] next [15:31:44.982] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:44.982] } [15:31:44.982] NAMES <- toupper(added) [15:31:44.982] for (kk in seq_along(NAMES)) { [15:31:44.982] name <- added[[kk]] [15:31:44.982] NAME <- NAMES[[kk]] [15:31:44.982] if (name != NAME && is.element(NAME, old_names)) [15:31:44.982] next [15:31:44.982] args[[name]] <- "" [15:31:44.982] } [15:31:44.982] NAMES <- toupper(removed) [15:31:44.982] for (kk in seq_along(NAMES)) { [15:31:44.982] name <- removed[[kk]] [15:31:44.982] NAME <- NAMES[[kk]] [15:31:44.982] if (name != NAME && is.element(NAME, old_names)) [15:31:44.982] next [15:31:44.982] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:44.982] } [15:31:44.982] if (length(args) > 0) [15:31:44.982] base::do.call(base::Sys.setenv, args = args) [15:31:44.982] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:44.982] } [15:31:44.982] else { [15:31:44.982] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:44.982] } [15:31:44.982] { [15:31:44.982] if (base::length(...future.futureOptionsAdded) > [15:31:44.982] 0L) { [15:31:44.982] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:44.982] base::names(opts) <- ...future.futureOptionsAdded [15:31:44.982] base::options(opts) [15:31:44.982] } [15:31:44.982] { [15:31:44.982] { [15:31:44.982] NULL [15:31:44.982] RNGkind("Mersenne-Twister") [15:31:44.982] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:44.982] inherits = FALSE) [15:31:44.982] } [15:31:44.982] options(future.plan = NULL) [15:31:44.982] if (is.na(NA_character_)) [15:31:44.982] Sys.unsetenv("R_FUTURE_PLAN") [15:31:44.982] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:44.982] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:44.982] .init = FALSE) [15:31:44.982] } [15:31:44.982] } [15:31:44.982] } [15:31:44.982] }) [15:31:44.982] if (TRUE) { [15:31:44.982] base::sink(type = "output", split = FALSE) [15:31:44.982] if (TRUE) { [15:31:44.982] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:44.982] } [15:31:44.982] else { [15:31:44.982] ...future.result["stdout"] <- base::list(NULL) [15:31:44.982] } [15:31:44.982] base::close(...future.stdout) [15:31:44.982] ...future.stdout <- NULL [15:31:44.982] } [15:31:44.982] ...future.result$conditions <- ...future.conditions [15:31:44.982] ...future.result$finished <- base::Sys.time() [15:31:44.982] ...future.result [15:31:44.982] } [15:31:44.989] assign_globals() ... [15:31:44.989] List of 5 [15:31:44.989] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:44.989] $ future.call.arguments :List of 1 [15:31:44.989] ..$ length: int 2 [15:31:44.989] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:44.989] $ ...future.elements_ii :List of 1 [15:31:44.989] ..$ c: chr "list" [15:31:44.989] $ ...future.seeds_ii : NULL [15:31:44.989] $ ...future.globals.maxSize: NULL [15:31:44.989] - attr(*, "where")=List of 5 [15:31:44.989] ..$ ...future.FUN : [15:31:44.989] ..$ future.call.arguments : [15:31:44.989] ..$ ...future.elements_ii : [15:31:44.989] ..$ ...future.seeds_ii : [15:31:44.989] ..$ ...future.globals.maxSize: [15:31:44.989] - attr(*, "resolved")= logi FALSE [15:31:44.989] - attr(*, "total_size")= num 2240 [15:31:44.989] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:44.989] - attr(*, "already-done")= logi TRUE [15:31:45.000] - copied '...future.FUN' to environment [15:31:45.001] - copied 'future.call.arguments' to environment [15:31:45.001] - copied '...future.elements_ii' to environment [15:31:45.001] - copied '...future.seeds_ii' to environment [15:31:45.001] - copied '...future.globals.maxSize' to environment [15:31:45.002] assign_globals() ... done [15:31:45.002] plan(): Setting new future strategy stack: [15:31:45.003] List of future strategies: [15:31:45.003] 1. sequential: [15:31:45.003] - args: function (..., envir = parent.frame(), workers = "") [15:31:45.003] - tweaked: FALSE [15:31:45.003] - call: NULL [15:31:45.004] plan(): nbrOfWorkers() = 1 [15:31:45.008] plan(): Setting new future strategy stack: [15:31:45.009] List of future strategies: [15:31:45.009] 1. sequential: [15:31:45.009] - args: function (..., envir = parent.frame(), workers = "") [15:31:45.009] - tweaked: FALSE [15:31:45.009] - call: plan(strategy) [15:31:45.009] plan(): nbrOfWorkers() = 1 [15:31:45.010] SequentialFuture started (and completed) [15:31:45.010] - Launch lazy future ... done [15:31:45.011] run() for 'SequentialFuture' ... done [15:31:45.011] Created future: [15:31:45.011] SequentialFuture: [15:31:45.011] Label: 'future_lapply-4' [15:31:45.011] Expression: [15:31:45.011] { [15:31:45.011] do.call(function(...) { [15:31:45.011] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.011] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:45.011] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.011] on.exit(options(oopts), add = TRUE) [15:31:45.011] } [15:31:45.011] { [15:31:45.011] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:45.011] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.011] ...future.FUN(...future.X_jj, ...) [15:31:45.011] }) [15:31:45.011] } [15:31:45.011] }, args = future.call.arguments) [15:31:45.011] } [15:31:45.011] Lazy evaluation: FALSE [15:31:45.011] Asynchronous evaluation: FALSE [15:31:45.011] Local evaluation: TRUE [15:31:45.011] Environment: R_GlobalEnv [15:31:45.011] Capture standard output: TRUE [15:31:45.011] Capture condition classes: 'condition' (excluding 'nothing') [15:31:45.011] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:45.011] Packages: [15:31:45.011] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:45.011] Resolved: TRUE [15:31:45.011] Value: 0 bytes of class 'list' [15:31:45.011] Early signaling: FALSE [15:31:45.011] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:45.011] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:45.013] Chunk #4 of 4 ... DONE [15:31:45.014] Launching 4 futures (chunks) ... DONE [15:31:45.014] Resolving 4 futures (chunks) ... [15:31:45.014] resolve() on list ... [15:31:45.015] recursive: 0 [15:31:45.015] length: 4 [15:31:45.015] [15:31:45.016] resolved() for 'SequentialFuture' ... [15:31:45.016] - state: 'finished' [15:31:45.016] - run: TRUE [15:31:45.017] - result: 'FutureResult' [15:31:45.017] resolved() for 'SequentialFuture' ... done [15:31:45.017] Future #1 [15:31:45.018] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:45.018] - nx: 4 [15:31:45.019] - relay: TRUE [15:31:45.019] - stdout: TRUE [15:31:45.019] - signal: TRUE [15:31:45.019] - resignal: FALSE [15:31:45.020] - force: TRUE [15:31:45.020] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [15:31:45.020] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [15:31:45.020] - until=1 [15:31:45.021] - relaying element #1 [15:31:45.021] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:45.021] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:45.022] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:45.022] length: 3 (resolved future 1) [15:31:45.023] resolved() for 'SequentialFuture' ... [15:31:45.023] - state: 'finished' [15:31:45.023] - run: TRUE [15:31:45.024] - result: 'FutureResult' [15:31:45.024] resolved() for 'SequentialFuture' ... done [15:31:45.024] Future #2 [15:31:45.025] signalConditionsASAP(SequentialFuture, pos=2) ... [15:31:45.025] - nx: 4 [15:31:45.025] - relay: TRUE [15:31:45.025] - stdout: TRUE [15:31:45.026] - signal: TRUE [15:31:45.026] - resignal: FALSE [15:31:45.026] - force: TRUE [15:31:45.026] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:45.027] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:45.027] - until=2 [15:31:45.027] - relaying element #2 [15:31:45.028] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:45.028] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:45.028] signalConditionsASAP(SequentialFuture, pos=2) ... done [15:31:45.029] length: 2 (resolved future 2) [15:31:45.029] resolved() for 'SequentialFuture' ... [15:31:45.029] - state: 'finished' [15:31:45.030] - run: TRUE [15:31:45.030] - result: 'FutureResult' [15:31:45.030] resolved() for 'SequentialFuture' ... done [15:31:45.031] Future #3 [15:31:45.031] signalConditionsASAP(SequentialFuture, pos=3) ... [15:31:45.031] - nx: 4 [15:31:45.031] - relay: TRUE [15:31:45.032] - stdout: TRUE [15:31:45.032] - signal: TRUE [15:31:45.032] - resignal: FALSE [15:31:45.032] - force: TRUE [15:31:45.033] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:45.033] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:45.033] - until=3 [15:31:45.033] - relaying element #3 [15:31:45.034] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:45.034] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:45.034] signalConditionsASAP(SequentialFuture, pos=3) ... done [15:31:45.035] length: 1 (resolved future 3) [15:31:45.035] resolved() for 'SequentialFuture' ... [15:31:45.035] - state: 'finished' [15:31:45.036] - run: TRUE [15:31:45.036] - result: 'FutureResult' [15:31:45.036] resolved() for 'SequentialFuture' ... done [15:31:45.037] Future #4 [15:31:45.037] signalConditionsASAP(SequentialFuture, pos=4) ... [15:31:45.037] - nx: 4 [15:31:45.038] - relay: TRUE [15:31:45.038] - stdout: TRUE [15:31:45.038] - signal: TRUE [15:31:45.038] - resignal: FALSE [15:31:45.039] - force: TRUE [15:31:45.039] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:45.039] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:45.040] - until=4 [15:31:45.040] - relaying element #4 [15:31:45.040] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:45.041] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:45.041] signalConditionsASAP(SequentialFuture, pos=4) ... done [15:31:45.041] length: 0 (resolved future 4) [15:31:45.041] Relaying remaining futures [15:31:45.042] signalConditionsASAP(NULL, pos=0) ... [15:31:45.042] - nx: 4 [15:31:45.042] - relay: TRUE [15:31:45.042] - stdout: TRUE [15:31:45.043] - signal: TRUE [15:31:45.043] - resignal: FALSE [15:31:45.043] - force: TRUE [15:31:45.044] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:45.044] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [15:31:45.044] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:45.045] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:45.045] signalConditionsASAP(NULL, pos=0) ... done [15:31:45.045] resolve() on list ... DONE [15:31:45.046] - Number of value chunks collected: 4 [15:31:45.046] Resolving 4 futures (chunks) ... DONE [15:31:45.046] Reducing values from 4 chunks ... [15:31:45.047] - Number of values collected after concatenation: 4 [15:31:45.047] - Number of values expected: 4 [15:31:45.047] Reducing values from 4 chunks ... DONE [15:31:45.048] 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 [15:31:45.052] future_lapply() ... [15:31:45.054] Number of chunks: 4 [15:31:45.054] getGlobalsAndPackagesXApply() ... [15:31:45.055] - future.globals: TRUE [15:31:45.055] getGlobalsAndPackages() ... [15:31:45.055] Searching for globals... [15:31:45.060] - globals found: [2] 'FUN', '.Internal' [15:31:45.060] Searching for globals ... DONE [15:31:45.061] Resolving globals: FALSE [15:31:45.061] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:45.062] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:45.062] - globals: [1] 'FUN' [15:31:45.063] [15:31:45.063] getGlobalsAndPackages() ... DONE [15:31:45.063] - globals found/used: [n=1] 'FUN' [15:31:45.064] - needed namespaces: [n=0] [15:31:45.064] Finding globals ... DONE [15:31:45.064] - use_args: TRUE [15:31:45.064] - Getting '...' globals ... [15:31:45.065] resolve() on list ... [15:31:45.065] recursive: 0 [15:31:45.066] length: 1 [15:31:45.066] elements: '...' [15:31:45.066] length: 0 (resolved future 1) [15:31:45.067] resolve() on list ... DONE [15:31:45.067] - '...' content: [n=1] 'length' [15:31:45.067] List of 1 [15:31:45.067] $ ...:List of 1 [15:31:45.067] ..$ length: int 2 [15:31:45.067] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:45.067] - attr(*, "where")=List of 1 [15:31:45.067] ..$ ...: [15:31:45.067] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:45.067] - attr(*, "resolved")= logi TRUE [15:31:45.067] - attr(*, "total_size")= num NA [15:31:45.073] - Getting '...' globals ... DONE [15:31:45.073] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:45.074] List of 2 [15:31:45.074] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:45.074] $ ... :List of 1 [15:31:45.074] ..$ length: int 2 [15:31:45.074] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:45.074] - attr(*, "where")=List of 2 [15:31:45.074] ..$ ...future.FUN: [15:31:45.074] ..$ ... : [15:31:45.074] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:45.074] - attr(*, "resolved")= logi FALSE [15:31:45.074] - attr(*, "total_size")= num 2240 [15:31:45.080] Packages to be attached in all futures: [n=0] [15:31:45.080] getGlobalsAndPackagesXApply() ... DONE [15:31:45.081] Number of futures (= number of chunks): 4 [15:31:45.081] Launching 4 futures (chunks) ... [15:31:45.081] Chunk #1 of 4 ... [15:31:45.082] - Finding globals in 'X' for chunk #1 ... [15:31:45.082] getGlobalsAndPackages() ... [15:31:45.082] Searching for globals... [15:31:45.083] [15:31:45.083] Searching for globals ... DONE [15:31:45.083] - globals: [0] [15:31:45.084] getGlobalsAndPackages() ... DONE [15:31:45.084] + additional globals found: [n=0] [15:31:45.084] + additional namespaces needed: [n=0] [15:31:45.085] - Finding globals in 'X' for chunk #1 ... DONE [15:31:45.085] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:45.085] - seeds: [15:31:45.085] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.086] getGlobalsAndPackages() ... [15:31:45.086] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.086] Resolving globals: FALSE [15:31:45.087] Tweak future expression to call with '...' arguments ... [15:31:45.087] { [15:31:45.087] do.call(function(...) { [15:31:45.087] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.087] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:45.087] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.087] on.exit(options(oopts), add = TRUE) [15:31:45.087] } [15:31:45.087] { [15:31:45.087] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:45.087] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.087] ...future.FUN(...future.X_jj, ...) [15:31:45.087] }) [15:31:45.087] } [15:31:45.087] }, args = future.call.arguments) [15:31:45.087] } [15:31:45.088] Tweak future expression to call with '...' arguments ... DONE [15:31:45.088] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.089] [15:31:45.089] getGlobalsAndPackages() ... DONE [15:31:45.090] run() for 'Future' ... [15:31:45.090] - state: 'created' [15:31:45.090] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:45.091] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:45.091] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:45.092] - Field: 'label' [15:31:45.092] - Field: 'local' [15:31:45.092] - Field: 'owner' [15:31:45.093] - Field: 'envir' [15:31:45.093] - Field: 'packages' [15:31:45.093] - Field: 'gc' [15:31:45.094] - Field: 'conditions' [15:31:45.094] - Field: 'expr' [15:31:45.094] - Field: 'uuid' [15:31:45.095] - Field: 'seed' [15:31:45.095] - Field: 'version' [15:31:45.095] - Field: 'result' [15:31:45.096] - Field: 'asynchronous' [15:31:45.096] - Field: 'calls' [15:31:45.096] - Field: 'globals' [15:31:45.097] - Field: 'stdout' [15:31:45.097] - Field: 'earlySignal' [15:31:45.097] - Field: 'lazy' [15:31:45.098] - Field: 'state' [15:31:45.098] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:45.098] - Launch lazy future ... [15:31:45.099] Packages needed by the future expression (n = 0): [15:31:45.099] Packages needed by future strategies (n = 0): [15:31:45.103] { [15:31:45.103] { [15:31:45.103] { [15:31:45.103] ...future.startTime <- base::Sys.time() [15:31:45.103] { [15:31:45.103] { [15:31:45.103] { [15:31:45.103] base::local({ [15:31:45.103] has_future <- base::requireNamespace("future", [15:31:45.103] quietly = TRUE) [15:31:45.103] if (has_future) { [15:31:45.103] ns <- base::getNamespace("future") [15:31:45.103] version <- ns[[".package"]][["version"]] [15:31:45.103] if (is.null(version)) [15:31:45.103] version <- utils::packageVersion("future") [15:31:45.103] } [15:31:45.103] else { [15:31:45.103] version <- NULL [15:31:45.103] } [15:31:45.103] if (!has_future || version < "1.8.0") { [15:31:45.103] info <- base::c(r_version = base::gsub("R version ", [15:31:45.103] "", base::R.version$version.string), [15:31:45.103] platform = base::sprintf("%s (%s-bit)", [15:31:45.103] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:45.103] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:45.103] "release", "version")], collapse = " "), [15:31:45.103] hostname = base::Sys.info()[["nodename"]]) [15:31:45.103] info <- base::sprintf("%s: %s", base::names(info), [15:31:45.103] info) [15:31:45.103] info <- base::paste(info, collapse = "; ") [15:31:45.103] if (!has_future) { [15:31:45.103] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:45.103] info) [15:31:45.103] } [15:31:45.103] else { [15:31:45.103] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:45.103] info, version) [15:31:45.103] } [15:31:45.103] base::stop(msg) [15:31:45.103] } [15:31:45.103] }) [15:31:45.103] } [15:31:45.103] ...future.strategy.old <- future::plan("list") [15:31:45.103] options(future.plan = NULL) [15:31:45.103] Sys.unsetenv("R_FUTURE_PLAN") [15:31:45.103] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:45.103] } [15:31:45.103] ...future.workdir <- getwd() [15:31:45.103] } [15:31:45.103] ...future.oldOptions <- base::as.list(base::.Options) [15:31:45.103] ...future.oldEnvVars <- base::Sys.getenv() [15:31:45.103] } [15:31:45.103] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:45.103] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:45.103] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:45.103] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:45.103] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:45.103] future.stdout.windows.reencode = NULL, width = 80L) [15:31:45.103] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:45.103] base::names(...future.oldOptions)) [15:31:45.103] } [15:31:45.103] if (FALSE) { [15:31:45.103] } [15:31:45.103] else { [15:31:45.103] if (TRUE) { [15:31:45.103] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:45.103] open = "w") [15:31:45.103] } [15:31:45.103] else { [15:31:45.103] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:45.103] windows = "NUL", "/dev/null"), open = "w") [15:31:45.103] } [15:31:45.103] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:45.103] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:45.103] base::sink(type = "output", split = FALSE) [15:31:45.103] base::close(...future.stdout) [15:31:45.103] }, add = TRUE) [15:31:45.103] } [15:31:45.103] ...future.frame <- base::sys.nframe() [15:31:45.103] ...future.conditions <- base::list() [15:31:45.103] ...future.rng <- base::globalenv()$.Random.seed [15:31:45.103] if (FALSE) { [15:31:45.103] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:45.103] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:45.103] } [15:31:45.103] ...future.result <- base::tryCatch({ [15:31:45.103] base::withCallingHandlers({ [15:31:45.103] ...future.value <- base::withVisible(base::local({ [15:31:45.103] do.call(function(...) { [15:31:45.103] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.103] if (!identical(...future.globals.maxSize.org, [15:31:45.103] ...future.globals.maxSize)) { [15:31:45.103] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.103] on.exit(options(oopts), add = TRUE) [15:31:45.103] } [15:31:45.103] { [15:31:45.103] lapply(seq_along(...future.elements_ii), [15:31:45.103] FUN = function(jj) { [15:31:45.103] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.103] ...future.FUN(...future.X_jj, ...) [15:31:45.103] }) [15:31:45.103] } [15:31:45.103] }, args = future.call.arguments) [15:31:45.103] })) [15:31:45.103] future::FutureResult(value = ...future.value$value, [15:31:45.103] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:45.103] ...future.rng), globalenv = if (FALSE) [15:31:45.103] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:45.103] ...future.globalenv.names)) [15:31:45.103] else NULL, started = ...future.startTime, version = "1.8") [15:31:45.103] }, condition = base::local({ [15:31:45.103] c <- base::c [15:31:45.103] inherits <- base::inherits [15:31:45.103] invokeRestart <- base::invokeRestart [15:31:45.103] length <- base::length [15:31:45.103] list <- base::list [15:31:45.103] seq.int <- base::seq.int [15:31:45.103] signalCondition <- base::signalCondition [15:31:45.103] sys.calls <- base::sys.calls [15:31:45.103] `[[` <- base::`[[` [15:31:45.103] `+` <- base::`+` [15:31:45.103] `<<-` <- base::`<<-` [15:31:45.103] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:45.103] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:45.103] 3L)] [15:31:45.103] } [15:31:45.103] function(cond) { [15:31:45.103] is_error <- inherits(cond, "error") [15:31:45.103] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:45.103] NULL) [15:31:45.103] if (is_error) { [15:31:45.103] sessionInformation <- function() { [15:31:45.103] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:45.103] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:45.103] search = base::search(), system = base::Sys.info()) [15:31:45.103] } [15:31:45.103] ...future.conditions[[length(...future.conditions) + [15:31:45.103] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:45.103] cond$call), session = sessionInformation(), [15:31:45.103] timestamp = base::Sys.time(), signaled = 0L) [15:31:45.103] signalCondition(cond) [15:31:45.103] } [15:31:45.103] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:45.103] "immediateCondition"))) { [15:31:45.103] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:45.103] ...future.conditions[[length(...future.conditions) + [15:31:45.103] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:45.103] if (TRUE && !signal) { [15:31:45.103] muffleCondition <- function (cond, pattern = "^muffle") [15:31:45.103] { [15:31:45.103] inherits <- base::inherits [15:31:45.103] invokeRestart <- base::invokeRestart [15:31:45.103] is.null <- base::is.null [15:31:45.103] muffled <- FALSE [15:31:45.103] if (inherits(cond, "message")) { [15:31:45.103] muffled <- grepl(pattern, "muffleMessage") [15:31:45.103] if (muffled) [15:31:45.103] invokeRestart("muffleMessage") [15:31:45.103] } [15:31:45.103] else if (inherits(cond, "warning")) { [15:31:45.103] muffled <- grepl(pattern, "muffleWarning") [15:31:45.103] if (muffled) [15:31:45.103] invokeRestart("muffleWarning") [15:31:45.103] } [15:31:45.103] else if (inherits(cond, "condition")) { [15:31:45.103] if (!is.null(pattern)) { [15:31:45.103] computeRestarts <- base::computeRestarts [15:31:45.103] grepl <- base::grepl [15:31:45.103] restarts <- computeRestarts(cond) [15:31:45.103] for (restart in restarts) { [15:31:45.103] name <- restart$name [15:31:45.103] if (is.null(name)) [15:31:45.103] next [15:31:45.103] if (!grepl(pattern, name)) [15:31:45.103] next [15:31:45.103] invokeRestart(restart) [15:31:45.103] muffled <- TRUE [15:31:45.103] break [15:31:45.103] } [15:31:45.103] } [15:31:45.103] } [15:31:45.103] invisible(muffled) [15:31:45.103] } [15:31:45.103] muffleCondition(cond, pattern = "^muffle") [15:31:45.103] } [15:31:45.103] } [15:31:45.103] else { [15:31:45.103] if (TRUE) { [15:31:45.103] muffleCondition <- function (cond, pattern = "^muffle") [15:31:45.103] { [15:31:45.103] inherits <- base::inherits [15:31:45.103] invokeRestart <- base::invokeRestart [15:31:45.103] is.null <- base::is.null [15:31:45.103] muffled <- FALSE [15:31:45.103] if (inherits(cond, "message")) { [15:31:45.103] muffled <- grepl(pattern, "muffleMessage") [15:31:45.103] if (muffled) [15:31:45.103] invokeRestart("muffleMessage") [15:31:45.103] } [15:31:45.103] else if (inherits(cond, "warning")) { [15:31:45.103] muffled <- grepl(pattern, "muffleWarning") [15:31:45.103] if (muffled) [15:31:45.103] invokeRestart("muffleWarning") [15:31:45.103] } [15:31:45.103] else if (inherits(cond, "condition")) { [15:31:45.103] if (!is.null(pattern)) { [15:31:45.103] computeRestarts <- base::computeRestarts [15:31:45.103] grepl <- base::grepl [15:31:45.103] restarts <- computeRestarts(cond) [15:31:45.103] for (restart in restarts) { [15:31:45.103] name <- restart$name [15:31:45.103] if (is.null(name)) [15:31:45.103] next [15:31:45.103] if (!grepl(pattern, name)) [15:31:45.103] next [15:31:45.103] invokeRestart(restart) [15:31:45.103] muffled <- TRUE [15:31:45.103] break [15:31:45.103] } [15:31:45.103] } [15:31:45.103] } [15:31:45.103] invisible(muffled) [15:31:45.103] } [15:31:45.103] muffleCondition(cond, pattern = "^muffle") [15:31:45.103] } [15:31:45.103] } [15:31:45.103] } [15:31:45.103] })) [15:31:45.103] }, error = function(ex) { [15:31:45.103] base::structure(base::list(value = NULL, visible = NULL, [15:31:45.103] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:45.103] ...future.rng), started = ...future.startTime, [15:31:45.103] finished = Sys.time(), session_uuid = NA_character_, [15:31:45.103] version = "1.8"), class = "FutureResult") [15:31:45.103] }, finally = { [15:31:45.103] if (!identical(...future.workdir, getwd())) [15:31:45.103] setwd(...future.workdir) [15:31:45.103] { [15:31:45.103] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:45.103] ...future.oldOptions$nwarnings <- NULL [15:31:45.103] } [15:31:45.103] base::options(...future.oldOptions) [15:31:45.103] if (.Platform$OS.type == "windows") { [15:31:45.103] old_names <- names(...future.oldEnvVars) [15:31:45.103] envs <- base::Sys.getenv() [15:31:45.103] names <- names(envs) [15:31:45.103] common <- intersect(names, old_names) [15:31:45.103] added <- setdiff(names, old_names) [15:31:45.103] removed <- setdiff(old_names, names) [15:31:45.103] changed <- common[...future.oldEnvVars[common] != [15:31:45.103] envs[common]] [15:31:45.103] NAMES <- toupper(changed) [15:31:45.103] args <- list() [15:31:45.103] for (kk in seq_along(NAMES)) { [15:31:45.103] name <- changed[[kk]] [15:31:45.103] NAME <- NAMES[[kk]] [15:31:45.103] if (name != NAME && is.element(NAME, old_names)) [15:31:45.103] next [15:31:45.103] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:45.103] } [15:31:45.103] NAMES <- toupper(added) [15:31:45.103] for (kk in seq_along(NAMES)) { [15:31:45.103] name <- added[[kk]] [15:31:45.103] NAME <- NAMES[[kk]] [15:31:45.103] if (name != NAME && is.element(NAME, old_names)) [15:31:45.103] next [15:31:45.103] args[[name]] <- "" [15:31:45.103] } [15:31:45.103] NAMES <- toupper(removed) [15:31:45.103] for (kk in seq_along(NAMES)) { [15:31:45.103] name <- removed[[kk]] [15:31:45.103] NAME <- NAMES[[kk]] [15:31:45.103] if (name != NAME && is.element(NAME, old_names)) [15:31:45.103] next [15:31:45.103] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:45.103] } [15:31:45.103] if (length(args) > 0) [15:31:45.103] base::do.call(base::Sys.setenv, args = args) [15:31:45.103] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:45.103] } [15:31:45.103] else { [15:31:45.103] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:45.103] } [15:31:45.103] { [15:31:45.103] if (base::length(...future.futureOptionsAdded) > [15:31:45.103] 0L) { [15:31:45.103] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:45.103] base::names(opts) <- ...future.futureOptionsAdded [15:31:45.103] base::options(opts) [15:31:45.103] } [15:31:45.103] { [15:31:45.103] { [15:31:45.103] NULL [15:31:45.103] RNGkind("Mersenne-Twister") [15:31:45.103] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:45.103] inherits = FALSE) [15:31:45.103] } [15:31:45.103] options(future.plan = NULL) [15:31:45.103] if (is.na(NA_character_)) [15:31:45.103] Sys.unsetenv("R_FUTURE_PLAN") [15:31:45.103] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:45.103] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:45.103] .init = FALSE) [15:31:45.103] } [15:31:45.103] } [15:31:45.103] } [15:31:45.103] }) [15:31:45.103] if (TRUE) { [15:31:45.103] base::sink(type = "output", split = FALSE) [15:31:45.103] if (TRUE) { [15:31:45.103] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:45.103] } [15:31:45.103] else { [15:31:45.103] ...future.result["stdout"] <- base::list(NULL) [15:31:45.103] } [15:31:45.103] base::close(...future.stdout) [15:31:45.103] ...future.stdout <- NULL [15:31:45.103] } [15:31:45.103] ...future.result$conditions <- ...future.conditions [15:31:45.103] ...future.result$finished <- base::Sys.time() [15:31:45.103] ...future.result [15:31:45.103] } [15:31:45.114] assign_globals() ... [15:31:45.114] List of 5 [15:31:45.114] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:45.114] $ future.call.arguments :List of 1 [15:31:45.114] ..$ length: int 2 [15:31:45.114] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:45.114] $ ...future.elements_ii :List of 1 [15:31:45.114] ..$ a: chr "integer" [15:31:45.114] $ ...future.seeds_ii : NULL [15:31:45.114] $ ...future.globals.maxSize: NULL [15:31:45.114] - attr(*, "where")=List of 5 [15:31:45.114] ..$ ...future.FUN : [15:31:45.114] ..$ future.call.arguments : [15:31:45.114] ..$ ...future.elements_ii : [15:31:45.114] ..$ ...future.seeds_ii : [15:31:45.114] ..$ ...future.globals.maxSize: [15:31:45.114] - attr(*, "resolved")= logi FALSE [15:31:45.114] - attr(*, "total_size")= num 2240 [15:31:45.114] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:45.114] - attr(*, "already-done")= logi TRUE [15:31:45.125] - copied '...future.FUN' to environment [15:31:45.125] - copied 'future.call.arguments' to environment [15:31:45.125] - copied '...future.elements_ii' to environment [15:31:45.125] - copied '...future.seeds_ii' to environment [15:31:45.126] - copied '...future.globals.maxSize' to environment [15:31:45.126] assign_globals() ... done [15:31:45.127] plan(): Setting new future strategy stack: [15:31:45.127] List of future strategies: [15:31:45.127] 1. sequential: [15:31:45.127] - args: function (..., envir = parent.frame(), workers = "") [15:31:45.127] - tweaked: FALSE [15:31:45.127] - call: NULL [15:31:45.128] plan(): nbrOfWorkers() = 1 [15:31:45.130] plan(): Setting new future strategy stack: [15:31:45.131] List of future strategies: [15:31:45.131] 1. sequential: [15:31:45.131] - args: function (..., envir = parent.frame(), workers = "") [15:31:45.131] - tweaked: FALSE [15:31:45.131] - call: plan(strategy) [15:31:45.132] plan(): nbrOfWorkers() = 1 [15:31:45.132] SequentialFuture started (and completed) [15:31:45.133] - Launch lazy future ... done [15:31:45.133] run() for 'SequentialFuture' ... done [15:31:45.133] Created future: [15:31:45.134] SequentialFuture: [15:31:45.134] Label: 'future_lapply-1' [15:31:45.134] Expression: [15:31:45.134] { [15:31:45.134] do.call(function(...) { [15:31:45.134] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.134] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:45.134] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.134] on.exit(options(oopts), add = TRUE) [15:31:45.134] } [15:31:45.134] { [15:31:45.134] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:45.134] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.134] ...future.FUN(...future.X_jj, ...) [15:31:45.134] }) [15:31:45.134] } [15:31:45.134] }, args = future.call.arguments) [15:31:45.134] } [15:31:45.134] Lazy evaluation: FALSE [15:31:45.134] Asynchronous evaluation: FALSE [15:31:45.134] Local evaluation: TRUE [15:31:45.134] Environment: R_GlobalEnv [15:31:45.134] Capture standard output: TRUE [15:31:45.134] Capture condition classes: 'condition' (excluding 'nothing') [15:31:45.134] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:45.134] Packages: [15:31:45.134] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:45.134] Resolved: TRUE [15:31:45.134] Value: 56 bytes of class 'list' [15:31:45.134] Early signaling: FALSE [15:31:45.134] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:45.134] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:45.136] Chunk #1 of 4 ... DONE [15:31:45.136] Chunk #2 of 4 ... [15:31:45.137] - Finding globals in 'X' for chunk #2 ... [15:31:45.137] getGlobalsAndPackages() ... [15:31:45.137] Searching for globals... [15:31:45.138] [15:31:45.138] Searching for globals ... DONE [15:31:45.138] - globals: [0] [15:31:45.139] getGlobalsAndPackages() ... DONE [15:31:45.139] + additional globals found: [n=0] [15:31:45.139] + additional namespaces needed: [n=0] [15:31:45.140] - Finding globals in 'X' for chunk #2 ... DONE [15:31:45.140] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:45.140] - seeds: [15:31:45.141] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.141] getGlobalsAndPackages() ... [15:31:45.141] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.142] Resolving globals: FALSE [15:31:45.142] Tweak future expression to call with '...' arguments ... [15:31:45.142] { [15:31:45.142] do.call(function(...) { [15:31:45.142] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.142] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:45.142] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.142] on.exit(options(oopts), add = TRUE) [15:31:45.142] } [15:31:45.142] { [15:31:45.142] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:45.142] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.142] ...future.FUN(...future.X_jj, ...) [15:31:45.142] }) [15:31:45.142] } [15:31:45.142] }, args = future.call.arguments) [15:31:45.142] } [15:31:45.143] Tweak future expression to call with '...' arguments ... DONE [15:31:45.144] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.144] [15:31:45.145] getGlobalsAndPackages() ... DONE [15:31:45.145] run() for 'Future' ... [15:31:45.146] - state: 'created' [15:31:45.146] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:45.147] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:45.147] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:45.147] - Field: 'label' [15:31:45.148] - Field: 'local' [15:31:45.148] - Field: 'owner' [15:31:45.148] - Field: 'envir' [15:31:45.149] - Field: 'packages' [15:31:45.149] - Field: 'gc' [15:31:45.149] - Field: 'conditions' [15:31:45.150] - Field: 'expr' [15:31:45.150] - Field: 'uuid' [15:31:45.150] - Field: 'seed' [15:31:45.151] - Field: 'version' [15:31:45.151] - Field: 'result' [15:31:45.151] - Field: 'asynchronous' [15:31:45.152] - Field: 'calls' [15:31:45.152] - Field: 'globals' [15:31:45.152] - Field: 'stdout' [15:31:45.153] - Field: 'earlySignal' [15:31:45.153] - Field: 'lazy' [15:31:45.153] - Field: 'state' [15:31:45.154] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:45.154] - Launch lazy future ... [15:31:45.155] Packages needed by the future expression (n = 0): [15:31:45.155] Packages needed by future strategies (n = 0): [15:31:45.156] { [15:31:45.156] { [15:31:45.156] { [15:31:45.156] ...future.startTime <- base::Sys.time() [15:31:45.156] { [15:31:45.156] { [15:31:45.156] { [15:31:45.156] base::local({ [15:31:45.156] has_future <- base::requireNamespace("future", [15:31:45.156] quietly = TRUE) [15:31:45.156] if (has_future) { [15:31:45.156] ns <- base::getNamespace("future") [15:31:45.156] version <- ns[[".package"]][["version"]] [15:31:45.156] if (is.null(version)) [15:31:45.156] version <- utils::packageVersion("future") [15:31:45.156] } [15:31:45.156] else { [15:31:45.156] version <- NULL [15:31:45.156] } [15:31:45.156] if (!has_future || version < "1.8.0") { [15:31:45.156] info <- base::c(r_version = base::gsub("R version ", [15:31:45.156] "", base::R.version$version.string), [15:31:45.156] platform = base::sprintf("%s (%s-bit)", [15:31:45.156] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:45.156] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:45.156] "release", "version")], collapse = " "), [15:31:45.156] hostname = base::Sys.info()[["nodename"]]) [15:31:45.156] info <- base::sprintf("%s: %s", base::names(info), [15:31:45.156] info) [15:31:45.156] info <- base::paste(info, collapse = "; ") [15:31:45.156] if (!has_future) { [15:31:45.156] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:45.156] info) [15:31:45.156] } [15:31:45.156] else { [15:31:45.156] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:45.156] info, version) [15:31:45.156] } [15:31:45.156] base::stop(msg) [15:31:45.156] } [15:31:45.156] }) [15:31:45.156] } [15:31:45.156] ...future.strategy.old <- future::plan("list") [15:31:45.156] options(future.plan = NULL) [15:31:45.156] Sys.unsetenv("R_FUTURE_PLAN") [15:31:45.156] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:45.156] } [15:31:45.156] ...future.workdir <- getwd() [15:31:45.156] } [15:31:45.156] ...future.oldOptions <- base::as.list(base::.Options) [15:31:45.156] ...future.oldEnvVars <- base::Sys.getenv() [15:31:45.156] } [15:31:45.156] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:45.156] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:45.156] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:45.156] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:45.156] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:45.156] future.stdout.windows.reencode = NULL, width = 80L) [15:31:45.156] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:45.156] base::names(...future.oldOptions)) [15:31:45.156] } [15:31:45.156] if (FALSE) { [15:31:45.156] } [15:31:45.156] else { [15:31:45.156] if (TRUE) { [15:31:45.156] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:45.156] open = "w") [15:31:45.156] } [15:31:45.156] else { [15:31:45.156] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:45.156] windows = "NUL", "/dev/null"), open = "w") [15:31:45.156] } [15:31:45.156] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:45.156] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:45.156] base::sink(type = "output", split = FALSE) [15:31:45.156] base::close(...future.stdout) [15:31:45.156] }, add = TRUE) [15:31:45.156] } [15:31:45.156] ...future.frame <- base::sys.nframe() [15:31:45.156] ...future.conditions <- base::list() [15:31:45.156] ...future.rng <- base::globalenv()$.Random.seed [15:31:45.156] if (FALSE) { [15:31:45.156] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:45.156] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:45.156] } [15:31:45.156] ...future.result <- base::tryCatch({ [15:31:45.156] base::withCallingHandlers({ [15:31:45.156] ...future.value <- base::withVisible(base::local({ [15:31:45.156] do.call(function(...) { [15:31:45.156] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.156] if (!identical(...future.globals.maxSize.org, [15:31:45.156] ...future.globals.maxSize)) { [15:31:45.156] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.156] on.exit(options(oopts), add = TRUE) [15:31:45.156] } [15:31:45.156] { [15:31:45.156] lapply(seq_along(...future.elements_ii), [15:31:45.156] FUN = function(jj) { [15:31:45.156] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.156] ...future.FUN(...future.X_jj, ...) [15:31:45.156] }) [15:31:45.156] } [15:31:45.156] }, args = future.call.arguments) [15:31:45.156] })) [15:31:45.156] future::FutureResult(value = ...future.value$value, [15:31:45.156] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:45.156] ...future.rng), globalenv = if (FALSE) [15:31:45.156] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:45.156] ...future.globalenv.names)) [15:31:45.156] else NULL, started = ...future.startTime, version = "1.8") [15:31:45.156] }, condition = base::local({ [15:31:45.156] c <- base::c [15:31:45.156] inherits <- base::inherits [15:31:45.156] invokeRestart <- base::invokeRestart [15:31:45.156] length <- base::length [15:31:45.156] list <- base::list [15:31:45.156] seq.int <- base::seq.int [15:31:45.156] signalCondition <- base::signalCondition [15:31:45.156] sys.calls <- base::sys.calls [15:31:45.156] `[[` <- base::`[[` [15:31:45.156] `+` <- base::`+` [15:31:45.156] `<<-` <- base::`<<-` [15:31:45.156] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:45.156] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:45.156] 3L)] [15:31:45.156] } [15:31:45.156] function(cond) { [15:31:45.156] is_error <- inherits(cond, "error") [15:31:45.156] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:45.156] NULL) [15:31:45.156] if (is_error) { [15:31:45.156] sessionInformation <- function() { [15:31:45.156] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:45.156] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:45.156] search = base::search(), system = base::Sys.info()) [15:31:45.156] } [15:31:45.156] ...future.conditions[[length(...future.conditions) + [15:31:45.156] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:45.156] cond$call), session = sessionInformation(), [15:31:45.156] timestamp = base::Sys.time(), signaled = 0L) [15:31:45.156] signalCondition(cond) [15:31:45.156] } [15:31:45.156] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:45.156] "immediateCondition"))) { [15:31:45.156] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:45.156] ...future.conditions[[length(...future.conditions) + [15:31:45.156] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:45.156] if (TRUE && !signal) { [15:31:45.156] muffleCondition <- function (cond, pattern = "^muffle") [15:31:45.156] { [15:31:45.156] inherits <- base::inherits [15:31:45.156] invokeRestart <- base::invokeRestart [15:31:45.156] is.null <- base::is.null [15:31:45.156] muffled <- FALSE [15:31:45.156] if (inherits(cond, "message")) { [15:31:45.156] muffled <- grepl(pattern, "muffleMessage") [15:31:45.156] if (muffled) [15:31:45.156] invokeRestart("muffleMessage") [15:31:45.156] } [15:31:45.156] else if (inherits(cond, "warning")) { [15:31:45.156] muffled <- grepl(pattern, "muffleWarning") [15:31:45.156] if (muffled) [15:31:45.156] invokeRestart("muffleWarning") [15:31:45.156] } [15:31:45.156] else if (inherits(cond, "condition")) { [15:31:45.156] if (!is.null(pattern)) { [15:31:45.156] computeRestarts <- base::computeRestarts [15:31:45.156] grepl <- base::grepl [15:31:45.156] restarts <- computeRestarts(cond) [15:31:45.156] for (restart in restarts) { [15:31:45.156] name <- restart$name [15:31:45.156] if (is.null(name)) [15:31:45.156] next [15:31:45.156] if (!grepl(pattern, name)) [15:31:45.156] next [15:31:45.156] invokeRestart(restart) [15:31:45.156] muffled <- TRUE [15:31:45.156] break [15:31:45.156] } [15:31:45.156] } [15:31:45.156] } [15:31:45.156] invisible(muffled) [15:31:45.156] } [15:31:45.156] muffleCondition(cond, pattern = "^muffle") [15:31:45.156] } [15:31:45.156] } [15:31:45.156] else { [15:31:45.156] if (TRUE) { [15:31:45.156] muffleCondition <- function (cond, pattern = "^muffle") [15:31:45.156] { [15:31:45.156] inherits <- base::inherits [15:31:45.156] invokeRestart <- base::invokeRestart [15:31:45.156] is.null <- base::is.null [15:31:45.156] muffled <- FALSE [15:31:45.156] if (inherits(cond, "message")) { [15:31:45.156] muffled <- grepl(pattern, "muffleMessage") [15:31:45.156] if (muffled) [15:31:45.156] invokeRestart("muffleMessage") [15:31:45.156] } [15:31:45.156] else if (inherits(cond, "warning")) { [15:31:45.156] muffled <- grepl(pattern, "muffleWarning") [15:31:45.156] if (muffled) [15:31:45.156] invokeRestart("muffleWarning") [15:31:45.156] } [15:31:45.156] else if (inherits(cond, "condition")) { [15:31:45.156] if (!is.null(pattern)) { [15:31:45.156] computeRestarts <- base::computeRestarts [15:31:45.156] grepl <- base::grepl [15:31:45.156] restarts <- computeRestarts(cond) [15:31:45.156] for (restart in restarts) { [15:31:45.156] name <- restart$name [15:31:45.156] if (is.null(name)) [15:31:45.156] next [15:31:45.156] if (!grepl(pattern, name)) [15:31:45.156] next [15:31:45.156] invokeRestart(restart) [15:31:45.156] muffled <- TRUE [15:31:45.156] break [15:31:45.156] } [15:31:45.156] } [15:31:45.156] } [15:31:45.156] invisible(muffled) [15:31:45.156] } [15:31:45.156] muffleCondition(cond, pattern = "^muffle") [15:31:45.156] } [15:31:45.156] } [15:31:45.156] } [15:31:45.156] })) [15:31:45.156] }, error = function(ex) { [15:31:45.156] base::structure(base::list(value = NULL, visible = NULL, [15:31:45.156] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:45.156] ...future.rng), started = ...future.startTime, [15:31:45.156] finished = Sys.time(), session_uuid = NA_character_, [15:31:45.156] version = "1.8"), class = "FutureResult") [15:31:45.156] }, finally = { [15:31:45.156] if (!identical(...future.workdir, getwd())) [15:31:45.156] setwd(...future.workdir) [15:31:45.156] { [15:31:45.156] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:45.156] ...future.oldOptions$nwarnings <- NULL [15:31:45.156] } [15:31:45.156] base::options(...future.oldOptions) [15:31:45.156] if (.Platform$OS.type == "windows") { [15:31:45.156] old_names <- names(...future.oldEnvVars) [15:31:45.156] envs <- base::Sys.getenv() [15:31:45.156] names <- names(envs) [15:31:45.156] common <- intersect(names, old_names) [15:31:45.156] added <- setdiff(names, old_names) [15:31:45.156] removed <- setdiff(old_names, names) [15:31:45.156] changed <- common[...future.oldEnvVars[common] != [15:31:45.156] envs[common]] [15:31:45.156] NAMES <- toupper(changed) [15:31:45.156] args <- list() [15:31:45.156] for (kk in seq_along(NAMES)) { [15:31:45.156] name <- changed[[kk]] [15:31:45.156] NAME <- NAMES[[kk]] [15:31:45.156] if (name != NAME && is.element(NAME, old_names)) [15:31:45.156] next [15:31:45.156] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:45.156] } [15:31:45.156] NAMES <- toupper(added) [15:31:45.156] for (kk in seq_along(NAMES)) { [15:31:45.156] name <- added[[kk]] [15:31:45.156] NAME <- NAMES[[kk]] [15:31:45.156] if (name != NAME && is.element(NAME, old_names)) [15:31:45.156] next [15:31:45.156] args[[name]] <- "" [15:31:45.156] } [15:31:45.156] NAMES <- toupper(removed) [15:31:45.156] for (kk in seq_along(NAMES)) { [15:31:45.156] name <- removed[[kk]] [15:31:45.156] NAME <- NAMES[[kk]] [15:31:45.156] if (name != NAME && is.element(NAME, old_names)) [15:31:45.156] next [15:31:45.156] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:45.156] } [15:31:45.156] if (length(args) > 0) [15:31:45.156] base::do.call(base::Sys.setenv, args = args) [15:31:45.156] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:45.156] } [15:31:45.156] else { [15:31:45.156] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:45.156] } [15:31:45.156] { [15:31:45.156] if (base::length(...future.futureOptionsAdded) > [15:31:45.156] 0L) { [15:31:45.156] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:45.156] base::names(opts) <- ...future.futureOptionsAdded [15:31:45.156] base::options(opts) [15:31:45.156] } [15:31:45.156] { [15:31:45.156] { [15:31:45.156] NULL [15:31:45.156] RNGkind("Mersenne-Twister") [15:31:45.156] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:45.156] inherits = FALSE) [15:31:45.156] } [15:31:45.156] options(future.plan = NULL) [15:31:45.156] if (is.na(NA_character_)) [15:31:45.156] Sys.unsetenv("R_FUTURE_PLAN") [15:31:45.156] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:45.156] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:45.156] .init = FALSE) [15:31:45.156] } [15:31:45.156] } [15:31:45.156] } [15:31:45.156] }) [15:31:45.156] if (TRUE) { [15:31:45.156] base::sink(type = "output", split = FALSE) [15:31:45.156] if (TRUE) { [15:31:45.156] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:45.156] } [15:31:45.156] else { [15:31:45.156] ...future.result["stdout"] <- base::list(NULL) [15:31:45.156] } [15:31:45.156] base::close(...future.stdout) [15:31:45.156] ...future.stdout <- NULL [15:31:45.156] } [15:31:45.156] ...future.result$conditions <- ...future.conditions [15:31:45.156] ...future.result$finished <- base::Sys.time() [15:31:45.156] ...future.result [15:31:45.156] } [15:31:45.164] assign_globals() ... [15:31:45.164] List of 5 [15:31:45.164] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:45.164] $ future.call.arguments :List of 1 [15:31:45.164] ..$ length: int 2 [15:31:45.164] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:45.164] $ ...future.elements_ii :List of 1 [15:31:45.164] ..$ b: chr "numeric" [15:31:45.164] $ ...future.seeds_ii : NULL [15:31:45.164] $ ...future.globals.maxSize: NULL [15:31:45.164] - attr(*, "where")=List of 5 [15:31:45.164] ..$ ...future.FUN : [15:31:45.164] ..$ future.call.arguments : [15:31:45.164] ..$ ...future.elements_ii : [15:31:45.164] ..$ ...future.seeds_ii : [15:31:45.164] ..$ ...future.globals.maxSize: [15:31:45.164] - attr(*, "resolved")= logi FALSE [15:31:45.164] - attr(*, "total_size")= num 2240 [15:31:45.164] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:45.164] - attr(*, "already-done")= logi TRUE [15:31:45.172] - copied '...future.FUN' to environment [15:31:45.173] - copied 'future.call.arguments' to environment [15:31:45.173] - copied '...future.elements_ii' to environment [15:31:45.173] - copied '...future.seeds_ii' to environment [15:31:45.173] - copied '...future.globals.maxSize' to environment [15:31:45.173] assign_globals() ... done [15:31:45.174] plan(): Setting new future strategy stack: [15:31:45.174] List of future strategies: [15:31:45.174] 1. sequential: [15:31:45.174] - args: function (..., envir = parent.frame(), workers = "") [15:31:45.174] - tweaked: FALSE [15:31:45.174] - call: NULL [15:31:45.175] plan(): nbrOfWorkers() = 1 [15:31:45.176] plan(): Setting new future strategy stack: [15:31:45.176] List of future strategies: [15:31:45.176] 1. sequential: [15:31:45.176] - args: function (..., envir = parent.frame(), workers = "") [15:31:45.176] - tweaked: FALSE [15:31:45.176] - call: plan(strategy) [15:31:45.177] plan(): nbrOfWorkers() = 1 [15:31:45.177] SequentialFuture started (and completed) [15:31:45.177] - Launch lazy future ... done [15:31:45.177] run() for 'SequentialFuture' ... done [15:31:45.178] Created future: [15:31:45.178] SequentialFuture: [15:31:45.178] Label: 'future_lapply-2' [15:31:45.178] Expression: [15:31:45.178] { [15:31:45.178] do.call(function(...) { [15:31:45.178] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.178] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:45.178] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.178] on.exit(options(oopts), add = TRUE) [15:31:45.178] } [15:31:45.178] { [15:31:45.178] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:45.178] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.178] ...future.FUN(...future.X_jj, ...) [15:31:45.178] }) [15:31:45.178] } [15:31:45.178] }, args = future.call.arguments) [15:31:45.178] } [15:31:45.178] Lazy evaluation: FALSE [15:31:45.178] Asynchronous evaluation: FALSE [15:31:45.178] Local evaluation: TRUE [15:31:45.178] Environment: R_GlobalEnv [15:31:45.178] Capture standard output: TRUE [15:31:45.178] Capture condition classes: 'condition' (excluding 'nothing') [15:31:45.178] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:45.178] Packages: [15:31:45.178] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:45.178] Resolved: TRUE [15:31:45.178] Value: 64 bytes of class 'list' [15:31:45.178] Early signaling: FALSE [15:31:45.178] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:45.178] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:45.179] Chunk #2 of 4 ... DONE [15:31:45.180] Chunk #3 of 4 ... [15:31:45.180] - Finding globals in 'X' for chunk #3 ... [15:31:45.180] getGlobalsAndPackages() ... [15:31:45.180] Searching for globals... [15:31:45.180] [15:31:45.181] Searching for globals ... DONE [15:31:45.181] - globals: [0] [15:31:45.181] getGlobalsAndPackages() ... DONE [15:31:45.181] + additional globals found: [n=0] [15:31:45.181] + additional namespaces needed: [n=0] [15:31:45.182] - Finding globals in 'X' for chunk #3 ... DONE [15:31:45.182] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:45.182] - seeds: [15:31:45.182] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.182] getGlobalsAndPackages() ... [15:31:45.182] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.183] Resolving globals: FALSE [15:31:45.183] Tweak future expression to call with '...' arguments ... [15:31:45.183] { [15:31:45.183] do.call(function(...) { [15:31:45.183] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.183] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:45.183] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.183] on.exit(options(oopts), add = TRUE) [15:31:45.183] } [15:31:45.183] { [15:31:45.183] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:45.183] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.183] ...future.FUN(...future.X_jj, ...) [15:31:45.183] }) [15:31:45.183] } [15:31:45.183] }, args = future.call.arguments) [15:31:45.183] } [15:31:45.183] Tweak future expression to call with '...' arguments ... DONE [15:31:45.184] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.184] [15:31:45.184] getGlobalsAndPackages() ... DONE [15:31:45.185] run() for 'Future' ... [15:31:45.185] - state: 'created' [15:31:45.185] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:45.186] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:45.186] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:45.186] - Field: 'label' [15:31:45.187] - Field: 'local' [15:31:45.187] - Field: 'owner' [15:31:45.187] - Field: 'envir' [15:31:45.188] - Field: 'packages' [15:31:45.188] - Field: 'gc' [15:31:45.188] - Field: 'conditions' [15:31:45.188] - Field: 'expr' [15:31:45.189] - Field: 'uuid' [15:31:45.189] - Field: 'seed' [15:31:45.189] - Field: 'version' [15:31:45.190] - Field: 'result' [15:31:45.190] - Field: 'asynchronous' [15:31:45.190] - Field: 'calls' [15:31:45.191] - Field: 'globals' [15:31:45.191] - Field: 'stdout' [15:31:45.191] - Field: 'earlySignal' [15:31:45.191] - Field: 'lazy' [15:31:45.192] - Field: 'state' [15:31:45.192] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:45.192] - Launch lazy future ... [15:31:45.193] Packages needed by the future expression (n = 0): [15:31:45.193] Packages needed by future strategies (n = 0): [15:31:45.194] { [15:31:45.194] { [15:31:45.194] { [15:31:45.194] ...future.startTime <- base::Sys.time() [15:31:45.194] { [15:31:45.194] { [15:31:45.194] { [15:31:45.194] base::local({ [15:31:45.194] has_future <- base::requireNamespace("future", [15:31:45.194] quietly = TRUE) [15:31:45.194] if (has_future) { [15:31:45.194] ns <- base::getNamespace("future") [15:31:45.194] version <- ns[[".package"]][["version"]] [15:31:45.194] if (is.null(version)) [15:31:45.194] version <- utils::packageVersion("future") [15:31:45.194] } [15:31:45.194] else { [15:31:45.194] version <- NULL [15:31:45.194] } [15:31:45.194] if (!has_future || version < "1.8.0") { [15:31:45.194] info <- base::c(r_version = base::gsub("R version ", [15:31:45.194] "", base::R.version$version.string), [15:31:45.194] platform = base::sprintf("%s (%s-bit)", [15:31:45.194] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:45.194] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:45.194] "release", "version")], collapse = " "), [15:31:45.194] hostname = base::Sys.info()[["nodename"]]) [15:31:45.194] info <- base::sprintf("%s: %s", base::names(info), [15:31:45.194] info) [15:31:45.194] info <- base::paste(info, collapse = "; ") [15:31:45.194] if (!has_future) { [15:31:45.194] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:45.194] info) [15:31:45.194] } [15:31:45.194] else { [15:31:45.194] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:45.194] info, version) [15:31:45.194] } [15:31:45.194] base::stop(msg) [15:31:45.194] } [15:31:45.194] }) [15:31:45.194] } [15:31:45.194] ...future.strategy.old <- future::plan("list") [15:31:45.194] options(future.plan = NULL) [15:31:45.194] Sys.unsetenv("R_FUTURE_PLAN") [15:31:45.194] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:45.194] } [15:31:45.194] ...future.workdir <- getwd() [15:31:45.194] } [15:31:45.194] ...future.oldOptions <- base::as.list(base::.Options) [15:31:45.194] ...future.oldEnvVars <- base::Sys.getenv() [15:31:45.194] } [15:31:45.194] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:45.194] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:45.194] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:45.194] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:45.194] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:45.194] future.stdout.windows.reencode = NULL, width = 80L) [15:31:45.194] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:45.194] base::names(...future.oldOptions)) [15:31:45.194] } [15:31:45.194] if (FALSE) { [15:31:45.194] } [15:31:45.194] else { [15:31:45.194] if (TRUE) { [15:31:45.194] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:45.194] open = "w") [15:31:45.194] } [15:31:45.194] else { [15:31:45.194] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:45.194] windows = "NUL", "/dev/null"), open = "w") [15:31:45.194] } [15:31:45.194] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:45.194] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:45.194] base::sink(type = "output", split = FALSE) [15:31:45.194] base::close(...future.stdout) [15:31:45.194] }, add = TRUE) [15:31:45.194] } [15:31:45.194] ...future.frame <- base::sys.nframe() [15:31:45.194] ...future.conditions <- base::list() [15:31:45.194] ...future.rng <- base::globalenv()$.Random.seed [15:31:45.194] if (FALSE) { [15:31:45.194] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:45.194] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:45.194] } [15:31:45.194] ...future.result <- base::tryCatch({ [15:31:45.194] base::withCallingHandlers({ [15:31:45.194] ...future.value <- base::withVisible(base::local({ [15:31:45.194] do.call(function(...) { [15:31:45.194] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.194] if (!identical(...future.globals.maxSize.org, [15:31:45.194] ...future.globals.maxSize)) { [15:31:45.194] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.194] on.exit(options(oopts), add = TRUE) [15:31:45.194] } [15:31:45.194] { [15:31:45.194] lapply(seq_along(...future.elements_ii), [15:31:45.194] FUN = function(jj) { [15:31:45.194] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.194] ...future.FUN(...future.X_jj, ...) [15:31:45.194] }) [15:31:45.194] } [15:31:45.194] }, args = future.call.arguments) [15:31:45.194] })) [15:31:45.194] future::FutureResult(value = ...future.value$value, [15:31:45.194] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:45.194] ...future.rng), globalenv = if (FALSE) [15:31:45.194] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:45.194] ...future.globalenv.names)) [15:31:45.194] else NULL, started = ...future.startTime, version = "1.8") [15:31:45.194] }, condition = base::local({ [15:31:45.194] c <- base::c [15:31:45.194] inherits <- base::inherits [15:31:45.194] invokeRestart <- base::invokeRestart [15:31:45.194] length <- base::length [15:31:45.194] list <- base::list [15:31:45.194] seq.int <- base::seq.int [15:31:45.194] signalCondition <- base::signalCondition [15:31:45.194] sys.calls <- base::sys.calls [15:31:45.194] `[[` <- base::`[[` [15:31:45.194] `+` <- base::`+` [15:31:45.194] `<<-` <- base::`<<-` [15:31:45.194] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:45.194] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:45.194] 3L)] [15:31:45.194] } [15:31:45.194] function(cond) { [15:31:45.194] is_error <- inherits(cond, "error") [15:31:45.194] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:45.194] NULL) [15:31:45.194] if (is_error) { [15:31:45.194] sessionInformation <- function() { [15:31:45.194] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:45.194] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:45.194] search = base::search(), system = base::Sys.info()) [15:31:45.194] } [15:31:45.194] ...future.conditions[[length(...future.conditions) + [15:31:45.194] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:45.194] cond$call), session = sessionInformation(), [15:31:45.194] timestamp = base::Sys.time(), signaled = 0L) [15:31:45.194] signalCondition(cond) [15:31:45.194] } [15:31:45.194] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:45.194] "immediateCondition"))) { [15:31:45.194] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:45.194] ...future.conditions[[length(...future.conditions) + [15:31:45.194] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:45.194] if (TRUE && !signal) { [15:31:45.194] muffleCondition <- function (cond, pattern = "^muffle") [15:31:45.194] { [15:31:45.194] inherits <- base::inherits [15:31:45.194] invokeRestart <- base::invokeRestart [15:31:45.194] is.null <- base::is.null [15:31:45.194] muffled <- FALSE [15:31:45.194] if (inherits(cond, "message")) { [15:31:45.194] muffled <- grepl(pattern, "muffleMessage") [15:31:45.194] if (muffled) [15:31:45.194] invokeRestart("muffleMessage") [15:31:45.194] } [15:31:45.194] else if (inherits(cond, "warning")) { [15:31:45.194] muffled <- grepl(pattern, "muffleWarning") [15:31:45.194] if (muffled) [15:31:45.194] invokeRestart("muffleWarning") [15:31:45.194] } [15:31:45.194] else if (inherits(cond, "condition")) { [15:31:45.194] if (!is.null(pattern)) { [15:31:45.194] computeRestarts <- base::computeRestarts [15:31:45.194] grepl <- base::grepl [15:31:45.194] restarts <- computeRestarts(cond) [15:31:45.194] for (restart in restarts) { [15:31:45.194] name <- restart$name [15:31:45.194] if (is.null(name)) [15:31:45.194] next [15:31:45.194] if (!grepl(pattern, name)) [15:31:45.194] next [15:31:45.194] invokeRestart(restart) [15:31:45.194] muffled <- TRUE [15:31:45.194] break [15:31:45.194] } [15:31:45.194] } [15:31:45.194] } [15:31:45.194] invisible(muffled) [15:31:45.194] } [15:31:45.194] muffleCondition(cond, pattern = "^muffle") [15:31:45.194] } [15:31:45.194] } [15:31:45.194] else { [15:31:45.194] if (TRUE) { [15:31:45.194] muffleCondition <- function (cond, pattern = "^muffle") [15:31:45.194] { [15:31:45.194] inherits <- base::inherits [15:31:45.194] invokeRestart <- base::invokeRestart [15:31:45.194] is.null <- base::is.null [15:31:45.194] muffled <- FALSE [15:31:45.194] if (inherits(cond, "message")) { [15:31:45.194] muffled <- grepl(pattern, "muffleMessage") [15:31:45.194] if (muffled) [15:31:45.194] invokeRestart("muffleMessage") [15:31:45.194] } [15:31:45.194] else if (inherits(cond, "warning")) { [15:31:45.194] muffled <- grepl(pattern, "muffleWarning") [15:31:45.194] if (muffled) [15:31:45.194] invokeRestart("muffleWarning") [15:31:45.194] } [15:31:45.194] else if (inherits(cond, "condition")) { [15:31:45.194] if (!is.null(pattern)) { [15:31:45.194] computeRestarts <- base::computeRestarts [15:31:45.194] grepl <- base::grepl [15:31:45.194] restarts <- computeRestarts(cond) [15:31:45.194] for (restart in restarts) { [15:31:45.194] name <- restart$name [15:31:45.194] if (is.null(name)) [15:31:45.194] next [15:31:45.194] if (!grepl(pattern, name)) [15:31:45.194] next [15:31:45.194] invokeRestart(restart) [15:31:45.194] muffled <- TRUE [15:31:45.194] break [15:31:45.194] } [15:31:45.194] } [15:31:45.194] } [15:31:45.194] invisible(muffled) [15:31:45.194] } [15:31:45.194] muffleCondition(cond, pattern = "^muffle") [15:31:45.194] } [15:31:45.194] } [15:31:45.194] } [15:31:45.194] })) [15:31:45.194] }, error = function(ex) { [15:31:45.194] base::structure(base::list(value = NULL, visible = NULL, [15:31:45.194] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:45.194] ...future.rng), started = ...future.startTime, [15:31:45.194] finished = Sys.time(), session_uuid = NA_character_, [15:31:45.194] version = "1.8"), class = "FutureResult") [15:31:45.194] }, finally = { [15:31:45.194] if (!identical(...future.workdir, getwd())) [15:31:45.194] setwd(...future.workdir) [15:31:45.194] { [15:31:45.194] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:45.194] ...future.oldOptions$nwarnings <- NULL [15:31:45.194] } [15:31:45.194] base::options(...future.oldOptions) [15:31:45.194] if (.Platform$OS.type == "windows") { [15:31:45.194] old_names <- names(...future.oldEnvVars) [15:31:45.194] envs <- base::Sys.getenv() [15:31:45.194] names <- names(envs) [15:31:45.194] common <- intersect(names, old_names) [15:31:45.194] added <- setdiff(names, old_names) [15:31:45.194] removed <- setdiff(old_names, names) [15:31:45.194] changed <- common[...future.oldEnvVars[common] != [15:31:45.194] envs[common]] [15:31:45.194] NAMES <- toupper(changed) [15:31:45.194] args <- list() [15:31:45.194] for (kk in seq_along(NAMES)) { [15:31:45.194] name <- changed[[kk]] [15:31:45.194] NAME <- NAMES[[kk]] [15:31:45.194] if (name != NAME && is.element(NAME, old_names)) [15:31:45.194] next [15:31:45.194] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:45.194] } [15:31:45.194] NAMES <- toupper(added) [15:31:45.194] for (kk in seq_along(NAMES)) { [15:31:45.194] name <- added[[kk]] [15:31:45.194] NAME <- NAMES[[kk]] [15:31:45.194] if (name != NAME && is.element(NAME, old_names)) [15:31:45.194] next [15:31:45.194] args[[name]] <- "" [15:31:45.194] } [15:31:45.194] NAMES <- toupper(removed) [15:31:45.194] for (kk in seq_along(NAMES)) { [15:31:45.194] name <- removed[[kk]] [15:31:45.194] NAME <- NAMES[[kk]] [15:31:45.194] if (name != NAME && is.element(NAME, old_names)) [15:31:45.194] next [15:31:45.194] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:45.194] } [15:31:45.194] if (length(args) > 0) [15:31:45.194] base::do.call(base::Sys.setenv, args = args) [15:31:45.194] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:45.194] } [15:31:45.194] else { [15:31:45.194] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:45.194] } [15:31:45.194] { [15:31:45.194] if (base::length(...future.futureOptionsAdded) > [15:31:45.194] 0L) { [15:31:45.194] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:45.194] base::names(opts) <- ...future.futureOptionsAdded [15:31:45.194] base::options(opts) [15:31:45.194] } [15:31:45.194] { [15:31:45.194] { [15:31:45.194] NULL [15:31:45.194] RNGkind("Mersenne-Twister") [15:31:45.194] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:45.194] inherits = FALSE) [15:31:45.194] } [15:31:45.194] options(future.plan = NULL) [15:31:45.194] if (is.na(NA_character_)) [15:31:45.194] Sys.unsetenv("R_FUTURE_PLAN") [15:31:45.194] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:45.194] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:45.194] .init = FALSE) [15:31:45.194] } [15:31:45.194] } [15:31:45.194] } [15:31:45.194] }) [15:31:45.194] if (TRUE) { [15:31:45.194] base::sink(type = "output", split = FALSE) [15:31:45.194] if (TRUE) { [15:31:45.194] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:45.194] } [15:31:45.194] else { [15:31:45.194] ...future.result["stdout"] <- base::list(NULL) [15:31:45.194] } [15:31:45.194] base::close(...future.stdout) [15:31:45.194] ...future.stdout <- NULL [15:31:45.194] } [15:31:45.194] ...future.result$conditions <- ...future.conditions [15:31:45.194] ...future.result$finished <- base::Sys.time() [15:31:45.194] ...future.result [15:31:45.194] } [15:31:45.201] assign_globals() ... [15:31:45.201] List of 5 [15:31:45.201] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:45.201] $ future.call.arguments :List of 1 [15:31:45.201] ..$ length: int 2 [15:31:45.201] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:45.201] $ ...future.elements_ii :List of 1 [15:31:45.201] ..$ c: chr "character" [15:31:45.201] $ ...future.seeds_ii : NULL [15:31:45.201] $ ...future.globals.maxSize: NULL [15:31:45.201] - attr(*, "where")=List of 5 [15:31:45.201] ..$ ...future.FUN : [15:31:45.201] ..$ future.call.arguments : [15:31:45.201] ..$ ...future.elements_ii : [15:31:45.201] ..$ ...future.seeds_ii : [15:31:45.201] ..$ ...future.globals.maxSize: [15:31:45.201] - attr(*, "resolved")= logi FALSE [15:31:45.201] - attr(*, "total_size")= num 2240 [15:31:45.201] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:45.201] - attr(*, "already-done")= logi TRUE [15:31:45.214] - copied '...future.FUN' to environment [15:31:45.214] - copied 'future.call.arguments' to environment [15:31:45.215] - copied '...future.elements_ii' to environment [15:31:45.215] - copied '...future.seeds_ii' to environment [15:31:45.215] - copied '...future.globals.maxSize' to environment [15:31:45.215] assign_globals() ... done [15:31:45.216] plan(): Setting new future strategy stack: [15:31:45.216] List of future strategies: [15:31:45.216] 1. sequential: [15:31:45.216] - args: function (..., envir = parent.frame(), workers = "") [15:31:45.216] - tweaked: FALSE [15:31:45.216] - call: NULL [15:31:45.216] plan(): nbrOfWorkers() = 1 [15:31:45.218] plan(): Setting new future strategy stack: [15:31:45.218] List of future strategies: [15:31:45.218] 1. sequential: [15:31:45.218] - args: function (..., envir = parent.frame(), workers = "") [15:31:45.218] - tweaked: FALSE [15:31:45.218] - call: plan(strategy) [15:31:45.219] plan(): nbrOfWorkers() = 1 [15:31:45.220] SequentialFuture started (and completed) [15:31:45.220] - Launch lazy future ... done [15:31:45.220] run() for 'SequentialFuture' ... done [15:31:45.221] Created future: [15:31:45.221] SequentialFuture: [15:31:45.221] Label: 'future_lapply-3' [15:31:45.221] Expression: [15:31:45.221] { [15:31:45.221] do.call(function(...) { [15:31:45.221] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.221] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:45.221] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.221] on.exit(options(oopts), add = TRUE) [15:31:45.221] } [15:31:45.221] { [15:31:45.221] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:45.221] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.221] ...future.FUN(...future.X_jj, ...) [15:31:45.221] }) [15:31:45.221] } [15:31:45.221] }, args = future.call.arguments) [15:31:45.221] } [15:31:45.221] Lazy evaluation: FALSE [15:31:45.221] Asynchronous evaluation: FALSE [15:31:45.221] Local evaluation: TRUE [15:31:45.221] Environment: R_GlobalEnv [15:31:45.221] Capture standard output: TRUE [15:31:45.221] Capture condition classes: 'condition' (excluding 'nothing') [15:31:45.221] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 120 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:45.221] Packages: [15:31:45.221] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:45.221] Resolved: TRUE [15:31:45.221] Value: 120 bytes of class 'list' [15:31:45.221] Early signaling: FALSE [15:31:45.221] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:45.221] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:45.223] Chunk #3 of 4 ... DONE [15:31:45.224] Chunk #4 of 4 ... [15:31:45.224] - Finding globals in 'X' for chunk #4 ... [15:31:45.224] getGlobalsAndPackages() ... [15:31:45.225] Searching for globals... [15:31:45.225] [15:31:45.226] Searching for globals ... DONE [15:31:45.226] - globals: [0] [15:31:45.226] getGlobalsAndPackages() ... DONE [15:31:45.227] + additional globals found: [n=0] [15:31:45.227] + additional namespaces needed: [n=0] [15:31:45.227] - Finding globals in 'X' for chunk #4 ... DONE [15:31:45.227] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:45.228] - seeds: [15:31:45.228] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.228] getGlobalsAndPackages() ... [15:31:45.229] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.229] Resolving globals: FALSE [15:31:45.229] Tweak future expression to call with '...' arguments ... [15:31:45.230] { [15:31:45.230] do.call(function(...) { [15:31:45.230] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.230] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:45.230] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.230] on.exit(options(oopts), add = TRUE) [15:31:45.230] } [15:31:45.230] { [15:31:45.230] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:45.230] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.230] ...future.FUN(...future.X_jj, ...) [15:31:45.230] }) [15:31:45.230] } [15:31:45.230] }, args = future.call.arguments) [15:31:45.230] } [15:31:45.231] Tweak future expression to call with '...' arguments ... DONE [15:31:45.232] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.232] [15:31:45.232] getGlobalsAndPackages() ... DONE [15:31:45.233] run() for 'Future' ... [15:31:45.233] - state: 'created' [15:31:45.234] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:45.234] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:45.235] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:45.235] - Field: 'label' [15:31:45.235] - Field: 'local' [15:31:45.236] - Field: 'owner' [15:31:45.236] - Field: 'envir' [15:31:45.236] - Field: 'packages' [15:31:45.237] - Field: 'gc' [15:31:45.237] - Field: 'conditions' [15:31:45.237] - Field: 'expr' [15:31:45.238] - Field: 'uuid' [15:31:45.238] - Field: 'seed' [15:31:45.238] - Field: 'version' [15:31:45.239] - Field: 'result' [15:31:45.239] - Field: 'asynchronous' [15:31:45.239] - Field: 'calls' [15:31:45.240] - Field: 'globals' [15:31:45.240] - Field: 'stdout' [15:31:45.240] - Field: 'earlySignal' [15:31:45.241] - Field: 'lazy' [15:31:45.241] - Field: 'state' [15:31:45.242] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:45.242] - Launch lazy future ... [15:31:45.242] Packages needed by the future expression (n = 0): [15:31:45.243] Packages needed by future strategies (n = 0): [15:31:45.244] { [15:31:45.244] { [15:31:45.244] { [15:31:45.244] ...future.startTime <- base::Sys.time() [15:31:45.244] { [15:31:45.244] { [15:31:45.244] { [15:31:45.244] base::local({ [15:31:45.244] has_future <- base::requireNamespace("future", [15:31:45.244] quietly = TRUE) [15:31:45.244] if (has_future) { [15:31:45.244] ns <- base::getNamespace("future") [15:31:45.244] version <- ns[[".package"]][["version"]] [15:31:45.244] if (is.null(version)) [15:31:45.244] version <- utils::packageVersion("future") [15:31:45.244] } [15:31:45.244] else { [15:31:45.244] version <- NULL [15:31:45.244] } [15:31:45.244] if (!has_future || version < "1.8.0") { [15:31:45.244] info <- base::c(r_version = base::gsub("R version ", [15:31:45.244] "", base::R.version$version.string), [15:31:45.244] platform = base::sprintf("%s (%s-bit)", [15:31:45.244] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:45.244] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:45.244] "release", "version")], collapse = " "), [15:31:45.244] hostname = base::Sys.info()[["nodename"]]) [15:31:45.244] info <- base::sprintf("%s: %s", base::names(info), [15:31:45.244] info) [15:31:45.244] info <- base::paste(info, collapse = "; ") [15:31:45.244] if (!has_future) { [15:31:45.244] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:45.244] info) [15:31:45.244] } [15:31:45.244] else { [15:31:45.244] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:45.244] info, version) [15:31:45.244] } [15:31:45.244] base::stop(msg) [15:31:45.244] } [15:31:45.244] }) [15:31:45.244] } [15:31:45.244] ...future.strategy.old <- future::plan("list") [15:31:45.244] options(future.plan = NULL) [15:31:45.244] Sys.unsetenv("R_FUTURE_PLAN") [15:31:45.244] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:45.244] } [15:31:45.244] ...future.workdir <- getwd() [15:31:45.244] } [15:31:45.244] ...future.oldOptions <- base::as.list(base::.Options) [15:31:45.244] ...future.oldEnvVars <- base::Sys.getenv() [15:31:45.244] } [15:31:45.244] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:45.244] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:45.244] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:45.244] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:45.244] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:45.244] future.stdout.windows.reencode = NULL, width = 80L) [15:31:45.244] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:45.244] base::names(...future.oldOptions)) [15:31:45.244] } [15:31:45.244] if (FALSE) { [15:31:45.244] } [15:31:45.244] else { [15:31:45.244] if (TRUE) { [15:31:45.244] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:45.244] open = "w") [15:31:45.244] } [15:31:45.244] else { [15:31:45.244] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:45.244] windows = "NUL", "/dev/null"), open = "w") [15:31:45.244] } [15:31:45.244] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:45.244] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:45.244] base::sink(type = "output", split = FALSE) [15:31:45.244] base::close(...future.stdout) [15:31:45.244] }, add = TRUE) [15:31:45.244] } [15:31:45.244] ...future.frame <- base::sys.nframe() [15:31:45.244] ...future.conditions <- base::list() [15:31:45.244] ...future.rng <- base::globalenv()$.Random.seed [15:31:45.244] if (FALSE) { [15:31:45.244] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:45.244] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:45.244] } [15:31:45.244] ...future.result <- base::tryCatch({ [15:31:45.244] base::withCallingHandlers({ [15:31:45.244] ...future.value <- base::withVisible(base::local({ [15:31:45.244] do.call(function(...) { [15:31:45.244] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.244] if (!identical(...future.globals.maxSize.org, [15:31:45.244] ...future.globals.maxSize)) { [15:31:45.244] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.244] on.exit(options(oopts), add = TRUE) [15:31:45.244] } [15:31:45.244] { [15:31:45.244] lapply(seq_along(...future.elements_ii), [15:31:45.244] FUN = function(jj) { [15:31:45.244] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.244] ...future.FUN(...future.X_jj, ...) [15:31:45.244] }) [15:31:45.244] } [15:31:45.244] }, args = future.call.arguments) [15:31:45.244] })) [15:31:45.244] future::FutureResult(value = ...future.value$value, [15:31:45.244] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:45.244] ...future.rng), globalenv = if (FALSE) [15:31:45.244] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:45.244] ...future.globalenv.names)) [15:31:45.244] else NULL, started = ...future.startTime, version = "1.8") [15:31:45.244] }, condition = base::local({ [15:31:45.244] c <- base::c [15:31:45.244] inherits <- base::inherits [15:31:45.244] invokeRestart <- base::invokeRestart [15:31:45.244] length <- base::length [15:31:45.244] list <- base::list [15:31:45.244] seq.int <- base::seq.int [15:31:45.244] signalCondition <- base::signalCondition [15:31:45.244] sys.calls <- base::sys.calls [15:31:45.244] `[[` <- base::`[[` [15:31:45.244] `+` <- base::`+` [15:31:45.244] `<<-` <- base::`<<-` [15:31:45.244] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:45.244] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:45.244] 3L)] [15:31:45.244] } [15:31:45.244] function(cond) { [15:31:45.244] is_error <- inherits(cond, "error") [15:31:45.244] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:45.244] NULL) [15:31:45.244] if (is_error) { [15:31:45.244] sessionInformation <- function() { [15:31:45.244] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:45.244] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:45.244] search = base::search(), system = base::Sys.info()) [15:31:45.244] } [15:31:45.244] ...future.conditions[[length(...future.conditions) + [15:31:45.244] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:45.244] cond$call), session = sessionInformation(), [15:31:45.244] timestamp = base::Sys.time(), signaled = 0L) [15:31:45.244] signalCondition(cond) [15:31:45.244] } [15:31:45.244] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:45.244] "immediateCondition"))) { [15:31:45.244] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:45.244] ...future.conditions[[length(...future.conditions) + [15:31:45.244] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:45.244] if (TRUE && !signal) { [15:31:45.244] muffleCondition <- function (cond, pattern = "^muffle") [15:31:45.244] { [15:31:45.244] inherits <- base::inherits [15:31:45.244] invokeRestart <- base::invokeRestart [15:31:45.244] is.null <- base::is.null [15:31:45.244] muffled <- FALSE [15:31:45.244] if (inherits(cond, "message")) { [15:31:45.244] muffled <- grepl(pattern, "muffleMessage") [15:31:45.244] if (muffled) [15:31:45.244] invokeRestart("muffleMessage") [15:31:45.244] } [15:31:45.244] else if (inherits(cond, "warning")) { [15:31:45.244] muffled <- grepl(pattern, "muffleWarning") [15:31:45.244] if (muffled) [15:31:45.244] invokeRestart("muffleWarning") [15:31:45.244] } [15:31:45.244] else if (inherits(cond, "condition")) { [15:31:45.244] if (!is.null(pattern)) { [15:31:45.244] computeRestarts <- base::computeRestarts [15:31:45.244] grepl <- base::grepl [15:31:45.244] restarts <- computeRestarts(cond) [15:31:45.244] for (restart in restarts) { [15:31:45.244] name <- restart$name [15:31:45.244] if (is.null(name)) [15:31:45.244] next [15:31:45.244] if (!grepl(pattern, name)) [15:31:45.244] next [15:31:45.244] invokeRestart(restart) [15:31:45.244] muffled <- TRUE [15:31:45.244] break [15:31:45.244] } [15:31:45.244] } [15:31:45.244] } [15:31:45.244] invisible(muffled) [15:31:45.244] } [15:31:45.244] muffleCondition(cond, pattern = "^muffle") [15:31:45.244] } [15:31:45.244] } [15:31:45.244] else { [15:31:45.244] if (TRUE) { [15:31:45.244] muffleCondition <- function (cond, pattern = "^muffle") [15:31:45.244] { [15:31:45.244] inherits <- base::inherits [15:31:45.244] invokeRestart <- base::invokeRestart [15:31:45.244] is.null <- base::is.null [15:31:45.244] muffled <- FALSE [15:31:45.244] if (inherits(cond, "message")) { [15:31:45.244] muffled <- grepl(pattern, "muffleMessage") [15:31:45.244] if (muffled) [15:31:45.244] invokeRestart("muffleMessage") [15:31:45.244] } [15:31:45.244] else if (inherits(cond, "warning")) { [15:31:45.244] muffled <- grepl(pattern, "muffleWarning") [15:31:45.244] if (muffled) [15:31:45.244] invokeRestart("muffleWarning") [15:31:45.244] } [15:31:45.244] else if (inherits(cond, "condition")) { [15:31:45.244] if (!is.null(pattern)) { [15:31:45.244] computeRestarts <- base::computeRestarts [15:31:45.244] grepl <- base::grepl [15:31:45.244] restarts <- computeRestarts(cond) [15:31:45.244] for (restart in restarts) { [15:31:45.244] name <- restart$name [15:31:45.244] if (is.null(name)) [15:31:45.244] next [15:31:45.244] if (!grepl(pattern, name)) [15:31:45.244] next [15:31:45.244] invokeRestart(restart) [15:31:45.244] muffled <- TRUE [15:31:45.244] break [15:31:45.244] } [15:31:45.244] } [15:31:45.244] } [15:31:45.244] invisible(muffled) [15:31:45.244] } [15:31:45.244] muffleCondition(cond, pattern = "^muffle") [15:31:45.244] } [15:31:45.244] } [15:31:45.244] } [15:31:45.244] })) [15:31:45.244] }, error = function(ex) { [15:31:45.244] base::structure(base::list(value = NULL, visible = NULL, [15:31:45.244] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:45.244] ...future.rng), started = ...future.startTime, [15:31:45.244] finished = Sys.time(), session_uuid = NA_character_, [15:31:45.244] version = "1.8"), class = "FutureResult") [15:31:45.244] }, finally = { [15:31:45.244] if (!identical(...future.workdir, getwd())) [15:31:45.244] setwd(...future.workdir) [15:31:45.244] { [15:31:45.244] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:45.244] ...future.oldOptions$nwarnings <- NULL [15:31:45.244] } [15:31:45.244] base::options(...future.oldOptions) [15:31:45.244] if (.Platform$OS.type == "windows") { [15:31:45.244] old_names <- names(...future.oldEnvVars) [15:31:45.244] envs <- base::Sys.getenv() [15:31:45.244] names <- names(envs) [15:31:45.244] common <- intersect(names, old_names) [15:31:45.244] added <- setdiff(names, old_names) [15:31:45.244] removed <- setdiff(old_names, names) [15:31:45.244] changed <- common[...future.oldEnvVars[common] != [15:31:45.244] envs[common]] [15:31:45.244] NAMES <- toupper(changed) [15:31:45.244] args <- list() [15:31:45.244] for (kk in seq_along(NAMES)) { [15:31:45.244] name <- changed[[kk]] [15:31:45.244] NAME <- NAMES[[kk]] [15:31:45.244] if (name != NAME && is.element(NAME, old_names)) [15:31:45.244] next [15:31:45.244] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:45.244] } [15:31:45.244] NAMES <- toupper(added) [15:31:45.244] for (kk in seq_along(NAMES)) { [15:31:45.244] name <- added[[kk]] [15:31:45.244] NAME <- NAMES[[kk]] [15:31:45.244] if (name != NAME && is.element(NAME, old_names)) [15:31:45.244] next [15:31:45.244] args[[name]] <- "" [15:31:45.244] } [15:31:45.244] NAMES <- toupper(removed) [15:31:45.244] for (kk in seq_along(NAMES)) { [15:31:45.244] name <- removed[[kk]] [15:31:45.244] NAME <- NAMES[[kk]] [15:31:45.244] if (name != NAME && is.element(NAME, old_names)) [15:31:45.244] next [15:31:45.244] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:45.244] } [15:31:45.244] if (length(args) > 0) [15:31:45.244] base::do.call(base::Sys.setenv, args = args) [15:31:45.244] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:45.244] } [15:31:45.244] else { [15:31:45.244] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:45.244] } [15:31:45.244] { [15:31:45.244] if (base::length(...future.futureOptionsAdded) > [15:31:45.244] 0L) { [15:31:45.244] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:45.244] base::names(opts) <- ...future.futureOptionsAdded [15:31:45.244] base::options(opts) [15:31:45.244] } [15:31:45.244] { [15:31:45.244] { [15:31:45.244] NULL [15:31:45.244] RNGkind("Mersenne-Twister") [15:31:45.244] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:45.244] inherits = FALSE) [15:31:45.244] } [15:31:45.244] options(future.plan = NULL) [15:31:45.244] if (is.na(NA_character_)) [15:31:45.244] Sys.unsetenv("R_FUTURE_PLAN") [15:31:45.244] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:45.244] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:45.244] .init = FALSE) [15:31:45.244] } [15:31:45.244] } [15:31:45.244] } [15:31:45.244] }) [15:31:45.244] if (TRUE) { [15:31:45.244] base::sink(type = "output", split = FALSE) [15:31:45.244] if (TRUE) { [15:31:45.244] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:45.244] } [15:31:45.244] else { [15:31:45.244] ...future.result["stdout"] <- base::list(NULL) [15:31:45.244] } [15:31:45.244] base::close(...future.stdout) [15:31:45.244] ...future.stdout <- NULL [15:31:45.244] } [15:31:45.244] ...future.result$conditions <- ...future.conditions [15:31:45.244] ...future.result$finished <- base::Sys.time() [15:31:45.244] ...future.result [15:31:45.244] } [15:31:45.251] assign_globals() ... [15:31:45.251] List of 5 [15:31:45.251] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:45.251] $ future.call.arguments :List of 1 [15:31:45.251] ..$ length: int 2 [15:31:45.251] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:45.251] $ ...future.elements_ii :List of 1 [15:31:45.251] ..$ c: chr "list" [15:31:45.251] $ ...future.seeds_ii : NULL [15:31:45.251] $ ...future.globals.maxSize: NULL [15:31:45.251] - attr(*, "where")=List of 5 [15:31:45.251] ..$ ...future.FUN : [15:31:45.251] ..$ future.call.arguments : [15:31:45.251] ..$ ...future.elements_ii : [15:31:45.251] ..$ ...future.seeds_ii : [15:31:45.251] ..$ ...future.globals.maxSize: [15:31:45.251] - attr(*, "resolved")= logi FALSE [15:31:45.251] - attr(*, "total_size")= num 2240 [15:31:45.251] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:45.251] - attr(*, "already-done")= logi TRUE [15:31:45.265] - copied '...future.FUN' to environment [15:31:45.265] - copied 'future.call.arguments' to environment [15:31:45.265] - copied '...future.elements_ii' to environment [15:31:45.266] - copied '...future.seeds_ii' to environment [15:31:45.266] - copied '...future.globals.maxSize' to environment [15:31:45.266] assign_globals() ... done [15:31:45.267] plan(): Setting new future strategy stack: [15:31:45.267] List of future strategies: [15:31:45.267] 1. sequential: [15:31:45.267] - args: function (..., envir = parent.frame(), workers = "") [15:31:45.267] - tweaked: FALSE [15:31:45.267] - call: NULL [15:31:45.268] plan(): nbrOfWorkers() = 1 [15:31:45.270] plan(): Setting new future strategy stack: [15:31:45.271] List of future strategies: [15:31:45.271] 1. sequential: [15:31:45.271] - args: function (..., envir = parent.frame(), workers = "") [15:31:45.271] - tweaked: FALSE [15:31:45.271] - call: plan(strategy) [15:31:45.272] plan(): nbrOfWorkers() = 1 [15:31:45.272] SequentialFuture started (and completed) [15:31:45.272] - Launch lazy future ... done [15:31:45.273] run() for 'SequentialFuture' ... done [15:31:45.273] Created future: [15:31:45.273] SequentialFuture: [15:31:45.273] Label: 'future_lapply-4' [15:31:45.273] Expression: [15:31:45.273] { [15:31:45.273] do.call(function(...) { [15:31:45.273] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.273] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:45.273] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.273] on.exit(options(oopts), add = TRUE) [15:31:45.273] } [15:31:45.273] { [15:31:45.273] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:45.273] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.273] ...future.FUN(...future.X_jj, ...) [15:31:45.273] }) [15:31:45.273] } [15:31:45.273] }, args = future.call.arguments) [15:31:45.273] } [15:31:45.273] Lazy evaluation: FALSE [15:31:45.273] Asynchronous evaluation: FALSE [15:31:45.273] Local evaluation: TRUE [15:31:45.273] Environment: R_GlobalEnv [15:31:45.273] Capture standard output: TRUE [15:31:45.273] Capture condition classes: 'condition' (excluding 'nothing') [15:31:45.273] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:45.273] Packages: [15:31:45.273] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:45.273] Resolved: TRUE [15:31:45.273] Value: 0 bytes of class 'list' [15:31:45.273] Early signaling: FALSE [15:31:45.273] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:45.273] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:45.276] Chunk #4 of 4 ... DONE [15:31:45.276] Launching 4 futures (chunks) ... DONE [15:31:45.276] Resolving 4 futures (chunks) ... [15:31:45.277] resolve() on list ... [15:31:45.277] recursive: 0 [15:31:45.277] length: 4 [15:31:45.277] [15:31:45.278] resolved() for 'SequentialFuture' ... [15:31:45.278] - state: 'finished' [15:31:45.278] - run: TRUE [15:31:45.279] - result: 'FutureResult' [15:31:45.279] resolved() for 'SequentialFuture' ... done [15:31:45.279] Future #1 [15:31:45.280] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:45.280] - nx: 4 [15:31:45.280] - relay: TRUE [15:31:45.281] - stdout: TRUE [15:31:45.281] - signal: TRUE [15:31:45.281] - resignal: FALSE [15:31:45.281] - force: TRUE [15:31:45.282] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [15:31:45.282] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [15:31:45.282] - until=1 [15:31:45.283] - relaying element #1 [15:31:45.283] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:45.283] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:45.284] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:45.284] length: 3 (resolved future 1) [15:31:45.284] resolved() for 'SequentialFuture' ... [15:31:45.285] - state: 'finished' [15:31:45.285] - run: TRUE [15:31:45.285] - result: 'FutureResult' [15:31:45.286] resolved() for 'SequentialFuture' ... done [15:31:45.286] Future #2 [15:31:45.286] signalConditionsASAP(SequentialFuture, pos=2) ... [15:31:45.287] - nx: 4 [15:31:45.287] - relay: TRUE [15:31:45.287] - stdout: TRUE [15:31:45.288] - signal: TRUE [15:31:45.288] - resignal: FALSE [15:31:45.288] - force: TRUE [15:31:45.288] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:45.289] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:45.289] - until=2 [15:31:45.289] - relaying element #2 [15:31:45.290] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:45.290] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:45.290] signalConditionsASAP(SequentialFuture, pos=2) ... done [15:31:45.291] length: 2 (resolved future 2) [15:31:45.291] resolved() for 'SequentialFuture' ... [15:31:45.291] - state: 'finished' [15:31:45.292] - run: TRUE [15:31:45.292] - result: 'FutureResult' [15:31:45.292] resolved() for 'SequentialFuture' ... done [15:31:45.293] Future #3 [15:31:45.293] signalConditionsASAP(SequentialFuture, pos=3) ... [15:31:45.293] - nx: 4 [15:31:45.294] - relay: TRUE [15:31:45.294] - stdout: TRUE [15:31:45.294] - signal: TRUE [15:31:45.294] - resignal: FALSE [15:31:45.295] - force: TRUE [15:31:45.295] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:45.295] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:45.296] - until=3 [15:31:45.296] - relaying element #3 [15:31:45.296] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:45.297] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:45.297] signalConditionsASAP(SequentialFuture, pos=3) ... done [15:31:45.297] length: 1 (resolved future 3) [15:31:45.298] resolved() for 'SequentialFuture' ... [15:31:45.298] - state: 'finished' [15:31:45.298] - run: TRUE [15:31:45.299] - result: 'FutureResult' [15:31:45.299] resolved() for 'SequentialFuture' ... done [15:31:45.299] Future #4 [15:31:45.303] signalConditionsASAP(SequentialFuture, pos=4) ... [15:31:45.303] - nx: 4 [15:31:45.303] - relay: TRUE [15:31:45.303] - stdout: TRUE [15:31:45.304] - signal: TRUE [15:31:45.304] - resignal: FALSE [15:31:45.304] - force: TRUE [15:31:45.305] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:45.305] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:45.305] - until=4 [15:31:45.305] - relaying element #4 [15:31:45.306] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:45.306] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:45.307] signalConditionsASAP(SequentialFuture, pos=4) ... done [15:31:45.307] length: 0 (resolved future 4) [15:31:45.307] Relaying remaining futures [15:31:45.307] signalConditionsASAP(NULL, pos=0) ... [15:31:45.308] - nx: 4 [15:31:45.308] - relay: TRUE [15:31:45.308] - stdout: TRUE [15:31:45.309] - signal: TRUE [15:31:45.309] - resignal: FALSE [15:31:45.309] - force: TRUE [15:31:45.309] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:45.310] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [15:31:45.310] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:45.310] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:45.311] signalConditionsASAP(NULL, pos=0) ... done [15:31:45.311] resolve() on list ... DONE [15:31:45.312] - Number of value chunks collected: 4 [15:31:45.312] Resolving 4 futures (chunks) ... DONE [15:31:45.312] Reducing values from 4 chunks ... [15:31:45.313] - Number of values collected after concatenation: 4 [15:31:45.313] - Number of values expected: 4 [15:31:45.313] Reducing values from 4 chunks ... DONE [15:31:45.313] 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, ...) ... [15:31:45.318] future_lapply() ... [15:31:45.320] Number of chunks: 4 [15:31:45.320] getGlobalsAndPackagesXApply() ... [15:31:45.320] - future.globals: TRUE [15:31:45.321] getGlobalsAndPackages() ... [15:31:45.321] Searching for globals... [15:31:45.324] - globals found: [2] 'FUN', '.Internal' [15:31:45.324] Searching for globals ... DONE [15:31:45.324] Resolving globals: FALSE [15:31:45.325] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:45.326] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:45.326] - globals: [1] 'FUN' [15:31:45.327] [15:31:45.327] getGlobalsAndPackages() ... DONE [15:31:45.327] - globals found/used: [n=1] 'FUN' [15:31:45.327] - needed namespaces: [n=0] [15:31:45.328] Finding globals ... DONE [15:31:45.328] - use_args: TRUE [15:31:45.328] - Getting '...' globals ... [15:31:45.329] resolve() on list ... [15:31:45.329] recursive: 0 [15:31:45.329] length: 1 [15:31:45.330] elements: '...' [15:31:45.330] length: 0 (resolved future 1) [15:31:45.330] resolve() on list ... DONE [15:31:45.331] - '...' content: [n=1] 'length' [15:31:45.331] List of 1 [15:31:45.331] $ ...:List of 1 [15:31:45.331] ..$ length: int 2 [15:31:45.331] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:45.331] - attr(*, "where")=List of 1 [15:31:45.331] ..$ ...: [15:31:45.331] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:45.331] - attr(*, "resolved")= logi TRUE [15:31:45.331] - attr(*, "total_size")= num NA [15:31:45.337] - Getting '...' globals ... DONE [15:31:45.337] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:45.337] List of 2 [15:31:45.337] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:45.337] $ ... :List of 1 [15:31:45.337] ..$ length: int 2 [15:31:45.337] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:45.337] - attr(*, "where")=List of 2 [15:31:45.337] ..$ ...future.FUN: [15:31:45.337] ..$ ... : [15:31:45.337] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:45.337] - attr(*, "resolved")= logi FALSE [15:31:45.337] - attr(*, "total_size")= num 2240 [15:31:45.344] Packages to be attached in all futures: [n=0] [15:31:45.344] getGlobalsAndPackagesXApply() ... DONE [15:31:45.344] Number of futures (= number of chunks): 4 [15:31:45.345] Launching 4 futures (chunks) ... [15:31:45.345] Chunk #1 of 4 ... [15:31:45.345] - Finding globals in 'X' for chunk #1 ... [15:31:45.345] getGlobalsAndPackages() ... [15:31:45.345] Searching for globals... [15:31:45.346] [15:31:45.346] Searching for globals ... DONE [15:31:45.346] - globals: [0] [15:31:45.346] getGlobalsAndPackages() ... DONE [15:31:45.346] + additional globals found: [n=0] [15:31:45.347] + additional namespaces needed: [n=0] [15:31:45.347] - Finding globals in 'X' for chunk #1 ... DONE [15:31:45.347] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:45.347] - seeds: [15:31:45.347] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.348] getGlobalsAndPackages() ... [15:31:45.348] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.348] Resolving globals: FALSE [15:31:45.348] Tweak future expression to call with '...' arguments ... [15:31:45.348] { [15:31:45.348] do.call(function(...) { [15:31:45.348] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.348] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:45.348] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.348] on.exit(options(oopts), add = TRUE) [15:31:45.348] } [15:31:45.348] { [15:31:45.348] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:45.348] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.348] ...future.FUN(...future.X_jj, ...) [15:31:45.348] }) [15:31:45.348] } [15:31:45.348] }, args = future.call.arguments) [15:31:45.348] } [15:31:45.349] Tweak future expression to call with '...' arguments ... DONE [15:31:45.349] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.350] [15:31:45.350] getGlobalsAndPackages() ... DONE [15:31:45.350] run() for 'Future' ... [15:31:45.350] - state: 'created' [15:31:45.351] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:45.351] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:45.351] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:45.352] - Field: 'label' [15:31:45.352] - Field: 'local' [15:31:45.352] - Field: 'owner' [15:31:45.352] - Field: 'envir' [15:31:45.352] - Field: 'packages' [15:31:45.352] - Field: 'gc' [15:31:45.353] - Field: 'conditions' [15:31:45.353] - Field: 'expr' [15:31:45.353] - Field: 'uuid' [15:31:45.353] - Field: 'seed' [15:31:45.353] - Field: 'version' [15:31:45.354] - Field: 'result' [15:31:45.354] - Field: 'asynchronous' [15:31:45.354] - Field: 'calls' [15:31:45.354] - Field: 'globals' [15:31:45.354] - Field: 'stdout' [15:31:45.355] - Field: 'earlySignal' [15:31:45.355] - Field: 'lazy' [15:31:45.355] - Field: 'state' [15:31:45.356] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:45.356] - Launch lazy future ... [15:31:45.356] Packages needed by the future expression (n = 0): [15:31:45.357] Packages needed by future strategies (n = 0): [15:31:45.357] { [15:31:45.357] { [15:31:45.357] { [15:31:45.357] ...future.startTime <- base::Sys.time() [15:31:45.357] { [15:31:45.357] { [15:31:45.357] { [15:31:45.357] base::local({ [15:31:45.357] has_future <- base::requireNamespace("future", [15:31:45.357] quietly = TRUE) [15:31:45.357] if (has_future) { [15:31:45.357] ns <- base::getNamespace("future") [15:31:45.357] version <- ns[[".package"]][["version"]] [15:31:45.357] if (is.null(version)) [15:31:45.357] version <- utils::packageVersion("future") [15:31:45.357] } [15:31:45.357] else { [15:31:45.357] version <- NULL [15:31:45.357] } [15:31:45.357] if (!has_future || version < "1.8.0") { [15:31:45.357] info <- base::c(r_version = base::gsub("R version ", [15:31:45.357] "", base::R.version$version.string), [15:31:45.357] platform = base::sprintf("%s (%s-bit)", [15:31:45.357] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:45.357] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:45.357] "release", "version")], collapse = " "), [15:31:45.357] hostname = base::Sys.info()[["nodename"]]) [15:31:45.357] info <- base::sprintf("%s: %s", base::names(info), [15:31:45.357] info) [15:31:45.357] info <- base::paste(info, collapse = "; ") [15:31:45.357] if (!has_future) { [15:31:45.357] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:45.357] info) [15:31:45.357] } [15:31:45.357] else { [15:31:45.357] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:45.357] info, version) [15:31:45.357] } [15:31:45.357] base::stop(msg) [15:31:45.357] } [15:31:45.357] }) [15:31:45.357] } [15:31:45.357] ...future.strategy.old <- future::plan("list") [15:31:45.357] options(future.plan = NULL) [15:31:45.357] Sys.unsetenv("R_FUTURE_PLAN") [15:31:45.357] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:45.357] } [15:31:45.357] ...future.workdir <- getwd() [15:31:45.357] } [15:31:45.357] ...future.oldOptions <- base::as.list(base::.Options) [15:31:45.357] ...future.oldEnvVars <- base::Sys.getenv() [15:31:45.357] } [15:31:45.357] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:45.357] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:45.357] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:45.357] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:45.357] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:45.357] future.stdout.windows.reencode = NULL, width = 80L) [15:31:45.357] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:45.357] base::names(...future.oldOptions)) [15:31:45.357] } [15:31:45.357] if (FALSE) { [15:31:45.357] } [15:31:45.357] else { [15:31:45.357] if (TRUE) { [15:31:45.357] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:45.357] open = "w") [15:31:45.357] } [15:31:45.357] else { [15:31:45.357] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:45.357] windows = "NUL", "/dev/null"), open = "w") [15:31:45.357] } [15:31:45.357] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:45.357] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:45.357] base::sink(type = "output", split = FALSE) [15:31:45.357] base::close(...future.stdout) [15:31:45.357] }, add = TRUE) [15:31:45.357] } [15:31:45.357] ...future.frame <- base::sys.nframe() [15:31:45.357] ...future.conditions <- base::list() [15:31:45.357] ...future.rng <- base::globalenv()$.Random.seed [15:31:45.357] if (FALSE) { [15:31:45.357] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:45.357] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:45.357] } [15:31:45.357] ...future.result <- base::tryCatch({ [15:31:45.357] base::withCallingHandlers({ [15:31:45.357] ...future.value <- base::withVisible(base::local({ [15:31:45.357] do.call(function(...) { [15:31:45.357] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.357] if (!identical(...future.globals.maxSize.org, [15:31:45.357] ...future.globals.maxSize)) { [15:31:45.357] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.357] on.exit(options(oopts), add = TRUE) [15:31:45.357] } [15:31:45.357] { [15:31:45.357] lapply(seq_along(...future.elements_ii), [15:31:45.357] FUN = function(jj) { [15:31:45.357] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.357] ...future.FUN(...future.X_jj, ...) [15:31:45.357] }) [15:31:45.357] } [15:31:45.357] }, args = future.call.arguments) [15:31:45.357] })) [15:31:45.357] future::FutureResult(value = ...future.value$value, [15:31:45.357] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:45.357] ...future.rng), globalenv = if (FALSE) [15:31:45.357] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:45.357] ...future.globalenv.names)) [15:31:45.357] else NULL, started = ...future.startTime, version = "1.8") [15:31:45.357] }, condition = base::local({ [15:31:45.357] c <- base::c [15:31:45.357] inherits <- base::inherits [15:31:45.357] invokeRestart <- base::invokeRestart [15:31:45.357] length <- base::length [15:31:45.357] list <- base::list [15:31:45.357] seq.int <- base::seq.int [15:31:45.357] signalCondition <- base::signalCondition [15:31:45.357] sys.calls <- base::sys.calls [15:31:45.357] `[[` <- base::`[[` [15:31:45.357] `+` <- base::`+` [15:31:45.357] `<<-` <- base::`<<-` [15:31:45.357] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:45.357] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:45.357] 3L)] [15:31:45.357] } [15:31:45.357] function(cond) { [15:31:45.357] is_error <- inherits(cond, "error") [15:31:45.357] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:45.357] NULL) [15:31:45.357] if (is_error) { [15:31:45.357] sessionInformation <- function() { [15:31:45.357] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:45.357] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:45.357] search = base::search(), system = base::Sys.info()) [15:31:45.357] } [15:31:45.357] ...future.conditions[[length(...future.conditions) + [15:31:45.357] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:45.357] cond$call), session = sessionInformation(), [15:31:45.357] timestamp = base::Sys.time(), signaled = 0L) [15:31:45.357] signalCondition(cond) [15:31:45.357] } [15:31:45.357] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:45.357] "immediateCondition"))) { [15:31:45.357] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:45.357] ...future.conditions[[length(...future.conditions) + [15:31:45.357] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:45.357] if (TRUE && !signal) { [15:31:45.357] muffleCondition <- function (cond, pattern = "^muffle") [15:31:45.357] { [15:31:45.357] inherits <- base::inherits [15:31:45.357] invokeRestart <- base::invokeRestart [15:31:45.357] is.null <- base::is.null [15:31:45.357] muffled <- FALSE [15:31:45.357] if (inherits(cond, "message")) { [15:31:45.357] muffled <- grepl(pattern, "muffleMessage") [15:31:45.357] if (muffled) [15:31:45.357] invokeRestart("muffleMessage") [15:31:45.357] } [15:31:45.357] else if (inherits(cond, "warning")) { [15:31:45.357] muffled <- grepl(pattern, "muffleWarning") [15:31:45.357] if (muffled) [15:31:45.357] invokeRestart("muffleWarning") [15:31:45.357] } [15:31:45.357] else if (inherits(cond, "condition")) { [15:31:45.357] if (!is.null(pattern)) { [15:31:45.357] computeRestarts <- base::computeRestarts [15:31:45.357] grepl <- base::grepl [15:31:45.357] restarts <- computeRestarts(cond) [15:31:45.357] for (restart in restarts) { [15:31:45.357] name <- restart$name [15:31:45.357] if (is.null(name)) [15:31:45.357] next [15:31:45.357] if (!grepl(pattern, name)) [15:31:45.357] next [15:31:45.357] invokeRestart(restart) [15:31:45.357] muffled <- TRUE [15:31:45.357] break [15:31:45.357] } [15:31:45.357] } [15:31:45.357] } [15:31:45.357] invisible(muffled) [15:31:45.357] } [15:31:45.357] muffleCondition(cond, pattern = "^muffle") [15:31:45.357] } [15:31:45.357] } [15:31:45.357] else { [15:31:45.357] if (TRUE) { [15:31:45.357] muffleCondition <- function (cond, pattern = "^muffle") [15:31:45.357] { [15:31:45.357] inherits <- base::inherits [15:31:45.357] invokeRestart <- base::invokeRestart [15:31:45.357] is.null <- base::is.null [15:31:45.357] muffled <- FALSE [15:31:45.357] if (inherits(cond, "message")) { [15:31:45.357] muffled <- grepl(pattern, "muffleMessage") [15:31:45.357] if (muffled) [15:31:45.357] invokeRestart("muffleMessage") [15:31:45.357] } [15:31:45.357] else if (inherits(cond, "warning")) { [15:31:45.357] muffled <- grepl(pattern, "muffleWarning") [15:31:45.357] if (muffled) [15:31:45.357] invokeRestart("muffleWarning") [15:31:45.357] } [15:31:45.357] else if (inherits(cond, "condition")) { [15:31:45.357] if (!is.null(pattern)) { [15:31:45.357] computeRestarts <- base::computeRestarts [15:31:45.357] grepl <- base::grepl [15:31:45.357] restarts <- computeRestarts(cond) [15:31:45.357] for (restart in restarts) { [15:31:45.357] name <- restart$name [15:31:45.357] if (is.null(name)) [15:31:45.357] next [15:31:45.357] if (!grepl(pattern, name)) [15:31:45.357] next [15:31:45.357] invokeRestart(restart) [15:31:45.357] muffled <- TRUE [15:31:45.357] break [15:31:45.357] } [15:31:45.357] } [15:31:45.357] } [15:31:45.357] invisible(muffled) [15:31:45.357] } [15:31:45.357] muffleCondition(cond, pattern = "^muffle") [15:31:45.357] } [15:31:45.357] } [15:31:45.357] } [15:31:45.357] })) [15:31:45.357] }, error = function(ex) { [15:31:45.357] base::structure(base::list(value = NULL, visible = NULL, [15:31:45.357] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:45.357] ...future.rng), started = ...future.startTime, [15:31:45.357] finished = Sys.time(), session_uuid = NA_character_, [15:31:45.357] version = "1.8"), class = "FutureResult") [15:31:45.357] }, finally = { [15:31:45.357] if (!identical(...future.workdir, getwd())) [15:31:45.357] setwd(...future.workdir) [15:31:45.357] { [15:31:45.357] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:45.357] ...future.oldOptions$nwarnings <- NULL [15:31:45.357] } [15:31:45.357] base::options(...future.oldOptions) [15:31:45.357] if (.Platform$OS.type == "windows") { [15:31:45.357] old_names <- names(...future.oldEnvVars) [15:31:45.357] envs <- base::Sys.getenv() [15:31:45.357] names <- names(envs) [15:31:45.357] common <- intersect(names, old_names) [15:31:45.357] added <- setdiff(names, old_names) [15:31:45.357] removed <- setdiff(old_names, names) [15:31:45.357] changed <- common[...future.oldEnvVars[common] != [15:31:45.357] envs[common]] [15:31:45.357] NAMES <- toupper(changed) [15:31:45.357] args <- list() [15:31:45.357] for (kk in seq_along(NAMES)) { [15:31:45.357] name <- changed[[kk]] [15:31:45.357] NAME <- NAMES[[kk]] [15:31:45.357] if (name != NAME && is.element(NAME, old_names)) [15:31:45.357] next [15:31:45.357] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:45.357] } [15:31:45.357] NAMES <- toupper(added) [15:31:45.357] for (kk in seq_along(NAMES)) { [15:31:45.357] name <- added[[kk]] [15:31:45.357] NAME <- NAMES[[kk]] [15:31:45.357] if (name != NAME && is.element(NAME, old_names)) [15:31:45.357] next [15:31:45.357] args[[name]] <- "" [15:31:45.357] } [15:31:45.357] NAMES <- toupper(removed) [15:31:45.357] for (kk in seq_along(NAMES)) { [15:31:45.357] name <- removed[[kk]] [15:31:45.357] NAME <- NAMES[[kk]] [15:31:45.357] if (name != NAME && is.element(NAME, old_names)) [15:31:45.357] next [15:31:45.357] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:45.357] } [15:31:45.357] if (length(args) > 0) [15:31:45.357] base::do.call(base::Sys.setenv, args = args) [15:31:45.357] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:45.357] } [15:31:45.357] else { [15:31:45.357] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:45.357] } [15:31:45.357] { [15:31:45.357] if (base::length(...future.futureOptionsAdded) > [15:31:45.357] 0L) { [15:31:45.357] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:45.357] base::names(opts) <- ...future.futureOptionsAdded [15:31:45.357] base::options(opts) [15:31:45.357] } [15:31:45.357] { [15:31:45.357] { [15:31:45.357] NULL [15:31:45.357] RNGkind("Mersenne-Twister") [15:31:45.357] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:45.357] inherits = FALSE) [15:31:45.357] } [15:31:45.357] options(future.plan = NULL) [15:31:45.357] if (is.na(NA_character_)) [15:31:45.357] Sys.unsetenv("R_FUTURE_PLAN") [15:31:45.357] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:45.357] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:45.357] .init = FALSE) [15:31:45.357] } [15:31:45.357] } [15:31:45.357] } [15:31:45.357] }) [15:31:45.357] if (TRUE) { [15:31:45.357] base::sink(type = "output", split = FALSE) [15:31:45.357] if (TRUE) { [15:31:45.357] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:45.357] } [15:31:45.357] else { [15:31:45.357] ...future.result["stdout"] <- base::list(NULL) [15:31:45.357] } [15:31:45.357] base::close(...future.stdout) [15:31:45.357] ...future.stdout <- NULL [15:31:45.357] } [15:31:45.357] ...future.result$conditions <- ...future.conditions [15:31:45.357] ...future.result$finished <- base::Sys.time() [15:31:45.357] ...future.result [15:31:45.357] } [15:31:45.363] assign_globals() ... [15:31:45.363] List of 5 [15:31:45.363] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:45.363] $ future.call.arguments :List of 1 [15:31:45.363] ..$ length: int 2 [15:31:45.363] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:45.363] $ ...future.elements_ii :List of 1 [15:31:45.363] ..$ a: chr "integer" [15:31:45.363] $ ...future.seeds_ii : NULL [15:31:45.363] $ ...future.globals.maxSize: NULL [15:31:45.363] - attr(*, "where")=List of 5 [15:31:45.363] ..$ ...future.FUN : [15:31:45.363] ..$ future.call.arguments : [15:31:45.363] ..$ ...future.elements_ii : [15:31:45.363] ..$ ...future.seeds_ii : [15:31:45.363] ..$ ...future.globals.maxSize: [15:31:45.363] - attr(*, "resolved")= logi FALSE [15:31:45.363] - attr(*, "total_size")= num 2240 [15:31:45.363] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:45.363] - attr(*, "already-done")= logi TRUE [15:31:45.370] - copied '...future.FUN' to environment [15:31:45.371] - copied 'future.call.arguments' to environment [15:31:45.371] - copied '...future.elements_ii' to environment [15:31:45.371] - copied '...future.seeds_ii' to environment [15:31:45.371] - copied '...future.globals.maxSize' to environment [15:31:45.371] assign_globals() ... done [15:31:45.372] plan(): Setting new future strategy stack: [15:31:45.372] List of future strategies: [15:31:45.372] 1. sequential: [15:31:45.372] - args: function (..., envir = parent.frame(), workers = "") [15:31:45.372] - tweaked: FALSE [15:31:45.372] - call: NULL [15:31:45.373] plan(): nbrOfWorkers() = 1 [15:31:45.376] plan(): Setting new future strategy stack: [15:31:45.377] List of future strategies: [15:31:45.377] 1. sequential: [15:31:45.377] - args: function (..., envir = parent.frame(), workers = "") [15:31:45.377] - tweaked: FALSE [15:31:45.377] - call: plan(strategy) [15:31:45.377] plan(): nbrOfWorkers() = 1 [15:31:45.378] SequentialFuture started (and completed) [15:31:45.378] - Launch lazy future ... done [15:31:45.378] run() for 'SequentialFuture' ... done [15:31:45.378] Created future: [15:31:45.378] SequentialFuture: [15:31:45.378] Label: 'future_lapply-1' [15:31:45.378] Expression: [15:31:45.378] { [15:31:45.378] do.call(function(...) { [15:31:45.378] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.378] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:45.378] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.378] on.exit(options(oopts), add = TRUE) [15:31:45.378] } [15:31:45.378] { [15:31:45.378] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:45.378] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.378] ...future.FUN(...future.X_jj, ...) [15:31:45.378] }) [15:31:45.378] } [15:31:45.378] }, args = future.call.arguments) [15:31:45.378] } [15:31:45.378] Lazy evaluation: FALSE [15:31:45.378] Asynchronous evaluation: FALSE [15:31:45.378] Local evaluation: TRUE [15:31:45.378] Environment: R_GlobalEnv [15:31:45.378] Capture standard output: TRUE [15:31:45.378] Capture condition classes: 'condition' (excluding 'nothing') [15:31:45.378] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:45.378] Packages: [15:31:45.378] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:45.378] Resolved: TRUE [15:31:45.378] Value: 56 bytes of class 'list' [15:31:45.378] Early signaling: FALSE [15:31:45.378] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:45.378] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:45.380] Chunk #1 of 4 ... DONE [15:31:45.380] Chunk #2 of 4 ... [15:31:45.380] - Finding globals in 'X' for chunk #2 ... [15:31:45.380] getGlobalsAndPackages() ... [15:31:45.380] Searching for globals... [15:31:45.381] [15:31:45.381] Searching for globals ... DONE [15:31:45.381] - globals: [0] [15:31:45.381] getGlobalsAndPackages() ... DONE [15:31:45.382] + additional globals found: [n=0] [15:31:45.382] + additional namespaces needed: [n=0] [15:31:45.382] - Finding globals in 'X' for chunk #2 ... DONE [15:31:45.382] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:45.382] - seeds: [15:31:45.382] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.383] getGlobalsAndPackages() ... [15:31:45.383] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.383] Resolving globals: FALSE [15:31:45.383] Tweak future expression to call with '...' arguments ... [15:31:45.383] { [15:31:45.383] do.call(function(...) { [15:31:45.383] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.383] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:45.383] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.383] on.exit(options(oopts), add = TRUE) [15:31:45.383] } [15:31:45.383] { [15:31:45.383] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:45.383] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.383] ...future.FUN(...future.X_jj, ...) [15:31:45.383] }) [15:31:45.383] } [15:31:45.383] }, args = future.call.arguments) [15:31:45.383] } [15:31:45.384] Tweak future expression to call with '...' arguments ... DONE [15:31:45.384] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.385] [15:31:45.385] getGlobalsAndPackages() ... DONE [15:31:45.385] run() for 'Future' ... [15:31:45.385] - state: 'created' [15:31:45.386] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:45.386] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:45.386] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:45.386] - Field: 'label' [15:31:45.387] - Field: 'local' [15:31:45.387] - Field: 'owner' [15:31:45.387] - Field: 'envir' [15:31:45.387] - Field: 'packages' [15:31:45.387] - Field: 'gc' [15:31:45.387] - Field: 'conditions' [15:31:45.388] - Field: 'expr' [15:31:45.388] - Field: 'uuid' [15:31:45.388] - Field: 'seed' [15:31:45.388] - Field: 'version' [15:31:45.388] - Field: 'result' [15:31:45.389] - Field: 'asynchronous' [15:31:45.389] - Field: 'calls' [15:31:45.389] - Field: 'globals' [15:31:45.389] - Field: 'stdout' [15:31:45.389] - Field: 'earlySignal' [15:31:45.390] - Field: 'lazy' [15:31:45.390] - Field: 'state' [15:31:45.390] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:45.391] - Launch lazy future ... [15:31:45.391] Packages needed by the future expression (n = 0): [15:31:45.391] Packages needed by future strategies (n = 0): [15:31:45.392] { [15:31:45.392] { [15:31:45.392] { [15:31:45.392] ...future.startTime <- base::Sys.time() [15:31:45.392] { [15:31:45.392] { [15:31:45.392] { [15:31:45.392] base::local({ [15:31:45.392] has_future <- base::requireNamespace("future", [15:31:45.392] quietly = TRUE) [15:31:45.392] if (has_future) { [15:31:45.392] ns <- base::getNamespace("future") [15:31:45.392] version <- ns[[".package"]][["version"]] [15:31:45.392] if (is.null(version)) [15:31:45.392] version <- utils::packageVersion("future") [15:31:45.392] } [15:31:45.392] else { [15:31:45.392] version <- NULL [15:31:45.392] } [15:31:45.392] if (!has_future || version < "1.8.0") { [15:31:45.392] info <- base::c(r_version = base::gsub("R version ", [15:31:45.392] "", base::R.version$version.string), [15:31:45.392] platform = base::sprintf("%s (%s-bit)", [15:31:45.392] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:45.392] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:45.392] "release", "version")], collapse = " "), [15:31:45.392] hostname = base::Sys.info()[["nodename"]]) [15:31:45.392] info <- base::sprintf("%s: %s", base::names(info), [15:31:45.392] info) [15:31:45.392] info <- base::paste(info, collapse = "; ") [15:31:45.392] if (!has_future) { [15:31:45.392] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:45.392] info) [15:31:45.392] } [15:31:45.392] else { [15:31:45.392] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:45.392] info, version) [15:31:45.392] } [15:31:45.392] base::stop(msg) [15:31:45.392] } [15:31:45.392] }) [15:31:45.392] } [15:31:45.392] ...future.strategy.old <- future::plan("list") [15:31:45.392] options(future.plan = NULL) [15:31:45.392] Sys.unsetenv("R_FUTURE_PLAN") [15:31:45.392] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:45.392] } [15:31:45.392] ...future.workdir <- getwd() [15:31:45.392] } [15:31:45.392] ...future.oldOptions <- base::as.list(base::.Options) [15:31:45.392] ...future.oldEnvVars <- base::Sys.getenv() [15:31:45.392] } [15:31:45.392] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:45.392] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:45.392] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:45.392] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:45.392] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:45.392] future.stdout.windows.reencode = NULL, width = 80L) [15:31:45.392] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:45.392] base::names(...future.oldOptions)) [15:31:45.392] } [15:31:45.392] if (FALSE) { [15:31:45.392] } [15:31:45.392] else { [15:31:45.392] if (TRUE) { [15:31:45.392] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:45.392] open = "w") [15:31:45.392] } [15:31:45.392] else { [15:31:45.392] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:45.392] windows = "NUL", "/dev/null"), open = "w") [15:31:45.392] } [15:31:45.392] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:45.392] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:45.392] base::sink(type = "output", split = FALSE) [15:31:45.392] base::close(...future.stdout) [15:31:45.392] }, add = TRUE) [15:31:45.392] } [15:31:45.392] ...future.frame <- base::sys.nframe() [15:31:45.392] ...future.conditions <- base::list() [15:31:45.392] ...future.rng <- base::globalenv()$.Random.seed [15:31:45.392] if (FALSE) { [15:31:45.392] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:45.392] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:45.392] } [15:31:45.392] ...future.result <- base::tryCatch({ [15:31:45.392] base::withCallingHandlers({ [15:31:45.392] ...future.value <- base::withVisible(base::local({ [15:31:45.392] do.call(function(...) { [15:31:45.392] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.392] if (!identical(...future.globals.maxSize.org, [15:31:45.392] ...future.globals.maxSize)) { [15:31:45.392] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.392] on.exit(options(oopts), add = TRUE) [15:31:45.392] } [15:31:45.392] { [15:31:45.392] lapply(seq_along(...future.elements_ii), [15:31:45.392] FUN = function(jj) { [15:31:45.392] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.392] ...future.FUN(...future.X_jj, ...) [15:31:45.392] }) [15:31:45.392] } [15:31:45.392] }, args = future.call.arguments) [15:31:45.392] })) [15:31:45.392] future::FutureResult(value = ...future.value$value, [15:31:45.392] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:45.392] ...future.rng), globalenv = if (FALSE) [15:31:45.392] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:45.392] ...future.globalenv.names)) [15:31:45.392] else NULL, started = ...future.startTime, version = "1.8") [15:31:45.392] }, condition = base::local({ [15:31:45.392] c <- base::c [15:31:45.392] inherits <- base::inherits [15:31:45.392] invokeRestart <- base::invokeRestart [15:31:45.392] length <- base::length [15:31:45.392] list <- base::list [15:31:45.392] seq.int <- base::seq.int [15:31:45.392] signalCondition <- base::signalCondition [15:31:45.392] sys.calls <- base::sys.calls [15:31:45.392] `[[` <- base::`[[` [15:31:45.392] `+` <- base::`+` [15:31:45.392] `<<-` <- base::`<<-` [15:31:45.392] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:45.392] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:45.392] 3L)] [15:31:45.392] } [15:31:45.392] function(cond) { [15:31:45.392] is_error <- inherits(cond, "error") [15:31:45.392] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:45.392] NULL) [15:31:45.392] if (is_error) { [15:31:45.392] sessionInformation <- function() { [15:31:45.392] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:45.392] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:45.392] search = base::search(), system = base::Sys.info()) [15:31:45.392] } [15:31:45.392] ...future.conditions[[length(...future.conditions) + [15:31:45.392] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:45.392] cond$call), session = sessionInformation(), [15:31:45.392] timestamp = base::Sys.time(), signaled = 0L) [15:31:45.392] signalCondition(cond) [15:31:45.392] } [15:31:45.392] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:45.392] "immediateCondition"))) { [15:31:45.392] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:45.392] ...future.conditions[[length(...future.conditions) + [15:31:45.392] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:45.392] if (TRUE && !signal) { [15:31:45.392] muffleCondition <- function (cond, pattern = "^muffle") [15:31:45.392] { [15:31:45.392] inherits <- base::inherits [15:31:45.392] invokeRestart <- base::invokeRestart [15:31:45.392] is.null <- base::is.null [15:31:45.392] muffled <- FALSE [15:31:45.392] if (inherits(cond, "message")) { [15:31:45.392] muffled <- grepl(pattern, "muffleMessage") [15:31:45.392] if (muffled) [15:31:45.392] invokeRestart("muffleMessage") [15:31:45.392] } [15:31:45.392] else if (inherits(cond, "warning")) { [15:31:45.392] muffled <- grepl(pattern, "muffleWarning") [15:31:45.392] if (muffled) [15:31:45.392] invokeRestart("muffleWarning") [15:31:45.392] } [15:31:45.392] else if (inherits(cond, "condition")) { [15:31:45.392] if (!is.null(pattern)) { [15:31:45.392] computeRestarts <- base::computeRestarts [15:31:45.392] grepl <- base::grepl [15:31:45.392] restarts <- computeRestarts(cond) [15:31:45.392] for (restart in restarts) { [15:31:45.392] name <- restart$name [15:31:45.392] if (is.null(name)) [15:31:45.392] next [15:31:45.392] if (!grepl(pattern, name)) [15:31:45.392] next [15:31:45.392] invokeRestart(restart) [15:31:45.392] muffled <- TRUE [15:31:45.392] break [15:31:45.392] } [15:31:45.392] } [15:31:45.392] } [15:31:45.392] invisible(muffled) [15:31:45.392] } [15:31:45.392] muffleCondition(cond, pattern = "^muffle") [15:31:45.392] } [15:31:45.392] } [15:31:45.392] else { [15:31:45.392] if (TRUE) { [15:31:45.392] muffleCondition <- function (cond, pattern = "^muffle") [15:31:45.392] { [15:31:45.392] inherits <- base::inherits [15:31:45.392] invokeRestart <- base::invokeRestart [15:31:45.392] is.null <- base::is.null [15:31:45.392] muffled <- FALSE [15:31:45.392] if (inherits(cond, "message")) { [15:31:45.392] muffled <- grepl(pattern, "muffleMessage") [15:31:45.392] if (muffled) [15:31:45.392] invokeRestart("muffleMessage") [15:31:45.392] } [15:31:45.392] else if (inherits(cond, "warning")) { [15:31:45.392] muffled <- grepl(pattern, "muffleWarning") [15:31:45.392] if (muffled) [15:31:45.392] invokeRestart("muffleWarning") [15:31:45.392] } [15:31:45.392] else if (inherits(cond, "condition")) { [15:31:45.392] if (!is.null(pattern)) { [15:31:45.392] computeRestarts <- base::computeRestarts [15:31:45.392] grepl <- base::grepl [15:31:45.392] restarts <- computeRestarts(cond) [15:31:45.392] for (restart in restarts) { [15:31:45.392] name <- restart$name [15:31:45.392] if (is.null(name)) [15:31:45.392] next [15:31:45.392] if (!grepl(pattern, name)) [15:31:45.392] next [15:31:45.392] invokeRestart(restart) [15:31:45.392] muffled <- TRUE [15:31:45.392] break [15:31:45.392] } [15:31:45.392] } [15:31:45.392] } [15:31:45.392] invisible(muffled) [15:31:45.392] } [15:31:45.392] muffleCondition(cond, pattern = "^muffle") [15:31:45.392] } [15:31:45.392] } [15:31:45.392] } [15:31:45.392] })) [15:31:45.392] }, error = function(ex) { [15:31:45.392] base::structure(base::list(value = NULL, visible = NULL, [15:31:45.392] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:45.392] ...future.rng), started = ...future.startTime, [15:31:45.392] finished = Sys.time(), session_uuid = NA_character_, [15:31:45.392] version = "1.8"), class = "FutureResult") [15:31:45.392] }, finally = { [15:31:45.392] if (!identical(...future.workdir, getwd())) [15:31:45.392] setwd(...future.workdir) [15:31:45.392] { [15:31:45.392] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:45.392] ...future.oldOptions$nwarnings <- NULL [15:31:45.392] } [15:31:45.392] base::options(...future.oldOptions) [15:31:45.392] if (.Platform$OS.type == "windows") { [15:31:45.392] old_names <- names(...future.oldEnvVars) [15:31:45.392] envs <- base::Sys.getenv() [15:31:45.392] names <- names(envs) [15:31:45.392] common <- intersect(names, old_names) [15:31:45.392] added <- setdiff(names, old_names) [15:31:45.392] removed <- setdiff(old_names, names) [15:31:45.392] changed <- common[...future.oldEnvVars[common] != [15:31:45.392] envs[common]] [15:31:45.392] NAMES <- toupper(changed) [15:31:45.392] args <- list() [15:31:45.392] for (kk in seq_along(NAMES)) { [15:31:45.392] name <- changed[[kk]] [15:31:45.392] NAME <- NAMES[[kk]] [15:31:45.392] if (name != NAME && is.element(NAME, old_names)) [15:31:45.392] next [15:31:45.392] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:45.392] } [15:31:45.392] NAMES <- toupper(added) [15:31:45.392] for (kk in seq_along(NAMES)) { [15:31:45.392] name <- added[[kk]] [15:31:45.392] NAME <- NAMES[[kk]] [15:31:45.392] if (name != NAME && is.element(NAME, old_names)) [15:31:45.392] next [15:31:45.392] args[[name]] <- "" [15:31:45.392] } [15:31:45.392] NAMES <- toupper(removed) [15:31:45.392] for (kk in seq_along(NAMES)) { [15:31:45.392] name <- removed[[kk]] [15:31:45.392] NAME <- NAMES[[kk]] [15:31:45.392] if (name != NAME && is.element(NAME, old_names)) [15:31:45.392] next [15:31:45.392] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:45.392] } [15:31:45.392] if (length(args) > 0) [15:31:45.392] base::do.call(base::Sys.setenv, args = args) [15:31:45.392] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:45.392] } [15:31:45.392] else { [15:31:45.392] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:45.392] } [15:31:45.392] { [15:31:45.392] if (base::length(...future.futureOptionsAdded) > [15:31:45.392] 0L) { [15:31:45.392] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:45.392] base::names(opts) <- ...future.futureOptionsAdded [15:31:45.392] base::options(opts) [15:31:45.392] } [15:31:45.392] { [15:31:45.392] { [15:31:45.392] NULL [15:31:45.392] RNGkind("Mersenne-Twister") [15:31:45.392] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:45.392] inherits = FALSE) [15:31:45.392] } [15:31:45.392] options(future.plan = NULL) [15:31:45.392] if (is.na(NA_character_)) [15:31:45.392] Sys.unsetenv("R_FUTURE_PLAN") [15:31:45.392] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:45.392] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:45.392] .init = FALSE) [15:31:45.392] } [15:31:45.392] } [15:31:45.392] } [15:31:45.392] }) [15:31:45.392] if (TRUE) { [15:31:45.392] base::sink(type = "output", split = FALSE) [15:31:45.392] if (TRUE) { [15:31:45.392] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:45.392] } [15:31:45.392] else { [15:31:45.392] ...future.result["stdout"] <- base::list(NULL) [15:31:45.392] } [15:31:45.392] base::close(...future.stdout) [15:31:45.392] ...future.stdout <- NULL [15:31:45.392] } [15:31:45.392] ...future.result$conditions <- ...future.conditions [15:31:45.392] ...future.result$finished <- base::Sys.time() [15:31:45.392] ...future.result [15:31:45.392] } [15:31:45.399] assign_globals() ... [15:31:45.399] List of 5 [15:31:45.399] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:45.399] $ future.call.arguments :List of 1 [15:31:45.399] ..$ length: int 2 [15:31:45.399] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:45.399] $ ...future.elements_ii :List of 1 [15:31:45.399] ..$ b: chr "numeric" [15:31:45.399] $ ...future.seeds_ii : NULL [15:31:45.399] $ ...future.globals.maxSize: NULL [15:31:45.399] - attr(*, "where")=List of 5 [15:31:45.399] ..$ ...future.FUN : [15:31:45.399] ..$ future.call.arguments : [15:31:45.399] ..$ ...future.elements_ii : [15:31:45.399] ..$ ...future.seeds_ii : [15:31:45.399] ..$ ...future.globals.maxSize: [15:31:45.399] - attr(*, "resolved")= logi FALSE [15:31:45.399] - attr(*, "total_size")= num 2240 [15:31:45.399] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:45.399] - attr(*, "already-done")= logi TRUE [15:31:45.410] - copied '...future.FUN' to environment [15:31:45.410] - copied 'future.call.arguments' to environment [15:31:45.410] - copied '...future.elements_ii' to environment [15:31:45.411] - copied '...future.seeds_ii' to environment [15:31:45.411] - copied '...future.globals.maxSize' to environment [15:31:45.411] assign_globals() ... done [15:31:45.412] plan(): Setting new future strategy stack: [15:31:45.412] List of future strategies: [15:31:45.412] 1. sequential: [15:31:45.412] - args: function (..., envir = parent.frame(), workers = "") [15:31:45.412] - tweaked: FALSE [15:31:45.412] - call: NULL [15:31:45.413] plan(): nbrOfWorkers() = 1 [15:31:45.450] plan(): Setting new future strategy stack: [15:31:45.451] List of future strategies: [15:31:45.451] 1. sequential: [15:31:45.451] - args: function (..., envir = parent.frame(), workers = "") [15:31:45.451] - tweaked: FALSE [15:31:45.451] - call: plan(strategy) [15:31:45.451] plan(): nbrOfWorkers() = 1 [15:31:45.452] SequentialFuture started (and completed) [15:31:45.452] - Launch lazy future ... done [15:31:45.452] run() for 'SequentialFuture' ... done [15:31:45.452] Created future: [15:31:45.453] SequentialFuture: [15:31:45.453] Label: 'future_lapply-2' [15:31:45.453] Expression: [15:31:45.453] { [15:31:45.453] do.call(function(...) { [15:31:45.453] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.453] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:45.453] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.453] on.exit(options(oopts), add = TRUE) [15:31:45.453] } [15:31:45.453] { [15:31:45.453] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:45.453] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.453] ...future.FUN(...future.X_jj, ...) [15:31:45.453] }) [15:31:45.453] } [15:31:45.453] }, args = future.call.arguments) [15:31:45.453] } [15:31:45.453] Lazy evaluation: FALSE [15:31:45.453] Asynchronous evaluation: FALSE [15:31:45.453] Local evaluation: TRUE [15:31:45.453] Environment: R_GlobalEnv [15:31:45.453] Capture standard output: TRUE [15:31:45.453] Capture condition classes: 'condition' (excluding 'nothing') [15:31:45.453] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:45.453] Packages: [15:31:45.453] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:45.453] Resolved: TRUE [15:31:45.453] Value: 64 bytes of class 'list' [15:31:45.453] Early signaling: FALSE [15:31:45.453] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:45.453] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:45.454] Chunk #2 of 4 ... DONE [15:31:45.454] Chunk #3 of 4 ... [15:31:45.455] - Finding globals in 'X' for chunk #3 ... [15:31:45.455] getGlobalsAndPackages() ... [15:31:45.455] Searching for globals... [15:31:45.455] [15:31:45.456] Searching for globals ... DONE [15:31:45.456] - globals: [0] [15:31:45.456] getGlobalsAndPackages() ... DONE [15:31:45.456] + additional globals found: [n=0] [15:31:45.456] + additional namespaces needed: [n=0] [15:31:45.456] - Finding globals in 'X' for chunk #3 ... DONE [15:31:45.457] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:45.457] - seeds: [15:31:45.457] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.457] getGlobalsAndPackages() ... [15:31:45.457] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.457] Resolving globals: FALSE [15:31:45.458] Tweak future expression to call with '...' arguments ... [15:31:45.458] { [15:31:45.458] do.call(function(...) { [15:31:45.458] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.458] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:45.458] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.458] on.exit(options(oopts), add = TRUE) [15:31:45.458] } [15:31:45.458] { [15:31:45.458] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:45.458] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.458] ...future.FUN(...future.X_jj, ...) [15:31:45.458] }) [15:31:45.458] } [15:31:45.458] }, args = future.call.arguments) [15:31:45.458] } [15:31:45.458] Tweak future expression to call with '...' arguments ... DONE [15:31:45.459] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.459] [15:31:45.460] getGlobalsAndPackages() ... DONE [15:31:45.460] run() for 'Future' ... [15:31:45.460] - state: 'created' [15:31:45.460] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:45.461] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:45.461] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:45.461] - Field: 'label' [15:31:45.461] - Field: 'local' [15:31:45.462] - Field: 'owner' [15:31:45.462] - Field: 'envir' [15:31:45.462] - Field: 'packages' [15:31:45.462] - Field: 'gc' [15:31:45.462] - Field: 'conditions' [15:31:45.462] - Field: 'expr' [15:31:45.463] - Field: 'uuid' [15:31:45.463] - Field: 'seed' [15:31:45.463] - Field: 'version' [15:31:45.463] - Field: 'result' [15:31:45.463] - Field: 'asynchronous' [15:31:45.464] - Field: 'calls' [15:31:45.464] - Field: 'globals' [15:31:45.464] - Field: 'stdout' [15:31:45.464] - Field: 'earlySignal' [15:31:45.464] - Field: 'lazy' [15:31:45.464] - Field: 'state' [15:31:45.465] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:45.465] - Launch lazy future ... [15:31:45.465] Packages needed by the future expression (n = 0): [15:31:45.465] Packages needed by future strategies (n = 0): [15:31:45.466] { [15:31:45.466] { [15:31:45.466] { [15:31:45.466] ...future.startTime <- base::Sys.time() [15:31:45.466] { [15:31:45.466] { [15:31:45.466] { [15:31:45.466] base::local({ [15:31:45.466] has_future <- base::requireNamespace("future", [15:31:45.466] quietly = TRUE) [15:31:45.466] if (has_future) { [15:31:45.466] ns <- base::getNamespace("future") [15:31:45.466] version <- ns[[".package"]][["version"]] [15:31:45.466] if (is.null(version)) [15:31:45.466] version <- utils::packageVersion("future") [15:31:45.466] } [15:31:45.466] else { [15:31:45.466] version <- NULL [15:31:45.466] } [15:31:45.466] if (!has_future || version < "1.8.0") { [15:31:45.466] info <- base::c(r_version = base::gsub("R version ", [15:31:45.466] "", base::R.version$version.string), [15:31:45.466] platform = base::sprintf("%s (%s-bit)", [15:31:45.466] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:45.466] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:45.466] "release", "version")], collapse = " "), [15:31:45.466] hostname = base::Sys.info()[["nodename"]]) [15:31:45.466] info <- base::sprintf("%s: %s", base::names(info), [15:31:45.466] info) [15:31:45.466] info <- base::paste(info, collapse = "; ") [15:31:45.466] if (!has_future) { [15:31:45.466] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:45.466] info) [15:31:45.466] } [15:31:45.466] else { [15:31:45.466] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:45.466] info, version) [15:31:45.466] } [15:31:45.466] base::stop(msg) [15:31:45.466] } [15:31:45.466] }) [15:31:45.466] } [15:31:45.466] ...future.strategy.old <- future::plan("list") [15:31:45.466] options(future.plan = NULL) [15:31:45.466] Sys.unsetenv("R_FUTURE_PLAN") [15:31:45.466] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:45.466] } [15:31:45.466] ...future.workdir <- getwd() [15:31:45.466] } [15:31:45.466] ...future.oldOptions <- base::as.list(base::.Options) [15:31:45.466] ...future.oldEnvVars <- base::Sys.getenv() [15:31:45.466] } [15:31:45.466] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:45.466] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:45.466] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:45.466] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:45.466] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:45.466] future.stdout.windows.reencode = NULL, width = 80L) [15:31:45.466] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:45.466] base::names(...future.oldOptions)) [15:31:45.466] } [15:31:45.466] if (FALSE) { [15:31:45.466] } [15:31:45.466] else { [15:31:45.466] if (TRUE) { [15:31:45.466] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:45.466] open = "w") [15:31:45.466] } [15:31:45.466] else { [15:31:45.466] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:45.466] windows = "NUL", "/dev/null"), open = "w") [15:31:45.466] } [15:31:45.466] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:45.466] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:45.466] base::sink(type = "output", split = FALSE) [15:31:45.466] base::close(...future.stdout) [15:31:45.466] }, add = TRUE) [15:31:45.466] } [15:31:45.466] ...future.frame <- base::sys.nframe() [15:31:45.466] ...future.conditions <- base::list() [15:31:45.466] ...future.rng <- base::globalenv()$.Random.seed [15:31:45.466] if (FALSE) { [15:31:45.466] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:45.466] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:45.466] } [15:31:45.466] ...future.result <- base::tryCatch({ [15:31:45.466] base::withCallingHandlers({ [15:31:45.466] ...future.value <- base::withVisible(base::local({ [15:31:45.466] do.call(function(...) { [15:31:45.466] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.466] if (!identical(...future.globals.maxSize.org, [15:31:45.466] ...future.globals.maxSize)) { [15:31:45.466] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.466] on.exit(options(oopts), add = TRUE) [15:31:45.466] } [15:31:45.466] { [15:31:45.466] lapply(seq_along(...future.elements_ii), [15:31:45.466] FUN = function(jj) { [15:31:45.466] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.466] ...future.FUN(...future.X_jj, ...) [15:31:45.466] }) [15:31:45.466] } [15:31:45.466] }, args = future.call.arguments) [15:31:45.466] })) [15:31:45.466] future::FutureResult(value = ...future.value$value, [15:31:45.466] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:45.466] ...future.rng), globalenv = if (FALSE) [15:31:45.466] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:45.466] ...future.globalenv.names)) [15:31:45.466] else NULL, started = ...future.startTime, version = "1.8") [15:31:45.466] }, condition = base::local({ [15:31:45.466] c <- base::c [15:31:45.466] inherits <- base::inherits [15:31:45.466] invokeRestart <- base::invokeRestart [15:31:45.466] length <- base::length [15:31:45.466] list <- base::list [15:31:45.466] seq.int <- base::seq.int [15:31:45.466] signalCondition <- base::signalCondition [15:31:45.466] sys.calls <- base::sys.calls [15:31:45.466] `[[` <- base::`[[` [15:31:45.466] `+` <- base::`+` [15:31:45.466] `<<-` <- base::`<<-` [15:31:45.466] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:45.466] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:45.466] 3L)] [15:31:45.466] } [15:31:45.466] function(cond) { [15:31:45.466] is_error <- inherits(cond, "error") [15:31:45.466] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:45.466] NULL) [15:31:45.466] if (is_error) { [15:31:45.466] sessionInformation <- function() { [15:31:45.466] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:45.466] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:45.466] search = base::search(), system = base::Sys.info()) [15:31:45.466] } [15:31:45.466] ...future.conditions[[length(...future.conditions) + [15:31:45.466] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:45.466] cond$call), session = sessionInformation(), [15:31:45.466] timestamp = base::Sys.time(), signaled = 0L) [15:31:45.466] signalCondition(cond) [15:31:45.466] } [15:31:45.466] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:45.466] "immediateCondition"))) { [15:31:45.466] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:45.466] ...future.conditions[[length(...future.conditions) + [15:31:45.466] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:45.466] if (TRUE && !signal) { [15:31:45.466] muffleCondition <- function (cond, pattern = "^muffle") [15:31:45.466] { [15:31:45.466] inherits <- base::inherits [15:31:45.466] invokeRestart <- base::invokeRestart [15:31:45.466] is.null <- base::is.null [15:31:45.466] muffled <- FALSE [15:31:45.466] if (inherits(cond, "message")) { [15:31:45.466] muffled <- grepl(pattern, "muffleMessage") [15:31:45.466] if (muffled) [15:31:45.466] invokeRestart("muffleMessage") [15:31:45.466] } [15:31:45.466] else if (inherits(cond, "warning")) { [15:31:45.466] muffled <- grepl(pattern, "muffleWarning") [15:31:45.466] if (muffled) [15:31:45.466] invokeRestart("muffleWarning") [15:31:45.466] } [15:31:45.466] else if (inherits(cond, "condition")) { [15:31:45.466] if (!is.null(pattern)) { [15:31:45.466] computeRestarts <- base::computeRestarts [15:31:45.466] grepl <- base::grepl [15:31:45.466] restarts <- computeRestarts(cond) [15:31:45.466] for (restart in restarts) { [15:31:45.466] name <- restart$name [15:31:45.466] if (is.null(name)) [15:31:45.466] next [15:31:45.466] if (!grepl(pattern, name)) [15:31:45.466] next [15:31:45.466] invokeRestart(restart) [15:31:45.466] muffled <- TRUE [15:31:45.466] break [15:31:45.466] } [15:31:45.466] } [15:31:45.466] } [15:31:45.466] invisible(muffled) [15:31:45.466] } [15:31:45.466] muffleCondition(cond, pattern = "^muffle") [15:31:45.466] } [15:31:45.466] } [15:31:45.466] else { [15:31:45.466] if (TRUE) { [15:31:45.466] muffleCondition <- function (cond, pattern = "^muffle") [15:31:45.466] { [15:31:45.466] inherits <- base::inherits [15:31:45.466] invokeRestart <- base::invokeRestart [15:31:45.466] is.null <- base::is.null [15:31:45.466] muffled <- FALSE [15:31:45.466] if (inherits(cond, "message")) { [15:31:45.466] muffled <- grepl(pattern, "muffleMessage") [15:31:45.466] if (muffled) [15:31:45.466] invokeRestart("muffleMessage") [15:31:45.466] } [15:31:45.466] else if (inherits(cond, "warning")) { [15:31:45.466] muffled <- grepl(pattern, "muffleWarning") [15:31:45.466] if (muffled) [15:31:45.466] invokeRestart("muffleWarning") [15:31:45.466] } [15:31:45.466] else if (inherits(cond, "condition")) { [15:31:45.466] if (!is.null(pattern)) { [15:31:45.466] computeRestarts <- base::computeRestarts [15:31:45.466] grepl <- base::grepl [15:31:45.466] restarts <- computeRestarts(cond) [15:31:45.466] for (restart in restarts) { [15:31:45.466] name <- restart$name [15:31:45.466] if (is.null(name)) [15:31:45.466] next [15:31:45.466] if (!grepl(pattern, name)) [15:31:45.466] next [15:31:45.466] invokeRestart(restart) [15:31:45.466] muffled <- TRUE [15:31:45.466] break [15:31:45.466] } [15:31:45.466] } [15:31:45.466] } [15:31:45.466] invisible(muffled) [15:31:45.466] } [15:31:45.466] muffleCondition(cond, pattern = "^muffle") [15:31:45.466] } [15:31:45.466] } [15:31:45.466] } [15:31:45.466] })) [15:31:45.466] }, error = function(ex) { [15:31:45.466] base::structure(base::list(value = NULL, visible = NULL, [15:31:45.466] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:45.466] ...future.rng), started = ...future.startTime, [15:31:45.466] finished = Sys.time(), session_uuid = NA_character_, [15:31:45.466] version = "1.8"), class = "FutureResult") [15:31:45.466] }, finally = { [15:31:45.466] if (!identical(...future.workdir, getwd())) [15:31:45.466] setwd(...future.workdir) [15:31:45.466] { [15:31:45.466] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:45.466] ...future.oldOptions$nwarnings <- NULL [15:31:45.466] } [15:31:45.466] base::options(...future.oldOptions) [15:31:45.466] if (.Platform$OS.type == "windows") { [15:31:45.466] old_names <- names(...future.oldEnvVars) [15:31:45.466] envs <- base::Sys.getenv() [15:31:45.466] names <- names(envs) [15:31:45.466] common <- intersect(names, old_names) [15:31:45.466] added <- setdiff(names, old_names) [15:31:45.466] removed <- setdiff(old_names, names) [15:31:45.466] changed <- common[...future.oldEnvVars[common] != [15:31:45.466] envs[common]] [15:31:45.466] NAMES <- toupper(changed) [15:31:45.466] args <- list() [15:31:45.466] for (kk in seq_along(NAMES)) { [15:31:45.466] name <- changed[[kk]] [15:31:45.466] NAME <- NAMES[[kk]] [15:31:45.466] if (name != NAME && is.element(NAME, old_names)) [15:31:45.466] next [15:31:45.466] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:45.466] } [15:31:45.466] NAMES <- toupper(added) [15:31:45.466] for (kk in seq_along(NAMES)) { [15:31:45.466] name <- added[[kk]] [15:31:45.466] NAME <- NAMES[[kk]] [15:31:45.466] if (name != NAME && is.element(NAME, old_names)) [15:31:45.466] next [15:31:45.466] args[[name]] <- "" [15:31:45.466] } [15:31:45.466] NAMES <- toupper(removed) [15:31:45.466] for (kk in seq_along(NAMES)) { [15:31:45.466] name <- removed[[kk]] [15:31:45.466] NAME <- NAMES[[kk]] [15:31:45.466] if (name != NAME && is.element(NAME, old_names)) [15:31:45.466] next [15:31:45.466] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:45.466] } [15:31:45.466] if (length(args) > 0) [15:31:45.466] base::do.call(base::Sys.setenv, args = args) [15:31:45.466] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:45.466] } [15:31:45.466] else { [15:31:45.466] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:45.466] } [15:31:45.466] { [15:31:45.466] if (base::length(...future.futureOptionsAdded) > [15:31:45.466] 0L) { [15:31:45.466] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:45.466] base::names(opts) <- ...future.futureOptionsAdded [15:31:45.466] base::options(opts) [15:31:45.466] } [15:31:45.466] { [15:31:45.466] { [15:31:45.466] NULL [15:31:45.466] RNGkind("Mersenne-Twister") [15:31:45.466] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:45.466] inherits = FALSE) [15:31:45.466] } [15:31:45.466] options(future.plan = NULL) [15:31:45.466] if (is.na(NA_character_)) [15:31:45.466] Sys.unsetenv("R_FUTURE_PLAN") [15:31:45.466] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:45.466] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:45.466] .init = FALSE) [15:31:45.466] } [15:31:45.466] } [15:31:45.466] } [15:31:45.466] }) [15:31:45.466] if (TRUE) { [15:31:45.466] base::sink(type = "output", split = FALSE) [15:31:45.466] if (TRUE) { [15:31:45.466] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:45.466] } [15:31:45.466] else { [15:31:45.466] ...future.result["stdout"] <- base::list(NULL) [15:31:45.466] } [15:31:45.466] base::close(...future.stdout) [15:31:45.466] ...future.stdout <- NULL [15:31:45.466] } [15:31:45.466] ...future.result$conditions <- ...future.conditions [15:31:45.466] ...future.result$finished <- base::Sys.time() [15:31:45.466] ...future.result [15:31:45.466] } [15:31:45.471] assign_globals() ... [15:31:45.472] List of 5 [15:31:45.472] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:45.472] $ future.call.arguments :List of 1 [15:31:45.472] ..$ length: int 2 [15:31:45.472] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:45.472] $ ...future.elements_ii :List of 1 [15:31:45.472] ..$ c: chr "character" [15:31:45.472] $ ...future.seeds_ii : NULL [15:31:45.472] $ ...future.globals.maxSize: NULL [15:31:45.472] - attr(*, "where")=List of 5 [15:31:45.472] ..$ ...future.FUN : [15:31:45.472] ..$ future.call.arguments : [15:31:45.472] ..$ ...future.elements_ii : [15:31:45.472] ..$ ...future.seeds_ii : [15:31:45.472] ..$ ...future.globals.maxSize: [15:31:45.472] - attr(*, "resolved")= logi FALSE [15:31:45.472] - attr(*, "total_size")= num 2240 [15:31:45.472] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:45.472] - attr(*, "already-done")= logi TRUE [15:31:45.479] - copied '...future.FUN' to environment [15:31:45.479] - copied 'future.call.arguments' to environment [15:31:45.479] - copied '...future.elements_ii' to environment [15:31:45.479] - copied '...future.seeds_ii' to environment [15:31:45.480] - copied '...future.globals.maxSize' to environment [15:31:45.480] assign_globals() ... done [15:31:45.480] plan(): Setting new future strategy stack: [15:31:45.480] List of future strategies: [15:31:45.480] 1. sequential: [15:31:45.480] - args: function (..., envir = parent.frame(), workers = "") [15:31:45.480] - tweaked: FALSE [15:31:45.480] - call: NULL [15:31:45.481] plan(): nbrOfWorkers() = 1 [15:31:45.482] plan(): Setting new future strategy stack: [15:31:45.483] List of future strategies: [15:31:45.483] 1. sequential: [15:31:45.483] - args: function (..., envir = parent.frame(), workers = "") [15:31:45.483] - tweaked: FALSE [15:31:45.483] - call: plan(strategy) [15:31:45.483] plan(): nbrOfWorkers() = 1 [15:31:45.484] SequentialFuture started (and completed) [15:31:45.484] - Launch lazy future ... done [15:31:45.484] run() for 'SequentialFuture' ... done [15:31:45.484] Created future: [15:31:45.484] SequentialFuture: [15:31:45.484] Label: 'future_lapply-3' [15:31:45.484] Expression: [15:31:45.484] { [15:31:45.484] do.call(function(...) { [15:31:45.484] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.484] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:45.484] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.484] on.exit(options(oopts), add = TRUE) [15:31:45.484] } [15:31:45.484] { [15:31:45.484] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:45.484] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.484] ...future.FUN(...future.X_jj, ...) [15:31:45.484] }) [15:31:45.484] } [15:31:45.484] }, args = future.call.arguments) [15:31:45.484] } [15:31:45.484] Lazy evaluation: FALSE [15:31:45.484] Asynchronous evaluation: FALSE [15:31:45.484] Local evaluation: TRUE [15:31:45.484] Environment: R_GlobalEnv [15:31:45.484] Capture standard output: TRUE [15:31:45.484] Capture condition classes: 'condition' (excluding 'nothing') [15:31:45.484] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 120 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:45.484] Packages: [15:31:45.484] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:45.484] Resolved: TRUE [15:31:45.484] Value: 120 bytes of class 'list' [15:31:45.484] Early signaling: FALSE [15:31:45.484] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:45.484] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:45.486] Chunk #3 of 4 ... DONE [15:31:45.486] Chunk #4 of 4 ... [15:31:45.488] - Finding globals in 'X' for chunk #4 ... [15:31:45.488] getGlobalsAndPackages() ... [15:31:45.488] Searching for globals... [15:31:45.489] [15:31:45.489] Searching for globals ... DONE [15:31:45.489] - globals: [0] [15:31:45.489] getGlobalsAndPackages() ... DONE [15:31:45.490] + additional globals found: [n=0] [15:31:45.490] + additional namespaces needed: [n=0] [15:31:45.490] - Finding globals in 'X' for chunk #4 ... DONE [15:31:45.490] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:45.491] - seeds: [15:31:45.491] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.492] getGlobalsAndPackages() ... [15:31:45.492] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.492] Resolving globals: FALSE [15:31:45.492] Tweak future expression to call with '...' arguments ... [15:31:45.493] { [15:31:45.493] do.call(function(...) { [15:31:45.493] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.493] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:45.493] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.493] on.exit(options(oopts), add = TRUE) [15:31:45.493] } [15:31:45.493] { [15:31:45.493] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:45.493] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.493] ...future.FUN(...future.X_jj, ...) [15:31:45.493] }) [15:31:45.493] } [15:31:45.493] }, args = future.call.arguments) [15:31:45.493] } [15:31:45.493] Tweak future expression to call with '...' arguments ... DONE [15:31:45.494] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.494] [15:31:45.494] getGlobalsAndPackages() ... DONE [15:31:45.495] run() for 'Future' ... [15:31:45.495] - state: 'created' [15:31:45.496] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:45.496] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:45.496] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:45.497] - Field: 'label' [15:31:45.497] - Field: 'local' [15:31:45.497] - Field: 'owner' [15:31:45.497] - Field: 'envir' [15:31:45.497] - Field: 'packages' [15:31:45.498] - Field: 'gc' [15:31:45.498] - Field: 'conditions' [15:31:45.498] - Field: 'expr' [15:31:45.498] - Field: 'uuid' [15:31:45.498] - Field: 'seed' [15:31:45.498] - Field: 'version' [15:31:45.499] - Field: 'result' [15:31:45.499] - Field: 'asynchronous' [15:31:45.499] - Field: 'calls' [15:31:45.500] - Field: 'globals' [15:31:45.500] - Field: 'stdout' [15:31:45.500] - Field: 'earlySignal' [15:31:45.501] - Field: 'lazy' [15:31:45.501] - Field: 'state' [15:31:45.501] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:45.501] - Launch lazy future ... [15:31:45.502] Packages needed by the future expression (n = 0): [15:31:45.502] Packages needed by future strategies (n = 0): [15:31:45.503] { [15:31:45.503] { [15:31:45.503] { [15:31:45.503] ...future.startTime <- base::Sys.time() [15:31:45.503] { [15:31:45.503] { [15:31:45.503] { [15:31:45.503] base::local({ [15:31:45.503] has_future <- base::requireNamespace("future", [15:31:45.503] quietly = TRUE) [15:31:45.503] if (has_future) { [15:31:45.503] ns <- base::getNamespace("future") [15:31:45.503] version <- ns[[".package"]][["version"]] [15:31:45.503] if (is.null(version)) [15:31:45.503] version <- utils::packageVersion("future") [15:31:45.503] } [15:31:45.503] else { [15:31:45.503] version <- NULL [15:31:45.503] } [15:31:45.503] if (!has_future || version < "1.8.0") { [15:31:45.503] info <- base::c(r_version = base::gsub("R version ", [15:31:45.503] "", base::R.version$version.string), [15:31:45.503] platform = base::sprintf("%s (%s-bit)", [15:31:45.503] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:45.503] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:45.503] "release", "version")], collapse = " "), [15:31:45.503] hostname = base::Sys.info()[["nodename"]]) [15:31:45.503] info <- base::sprintf("%s: %s", base::names(info), [15:31:45.503] info) [15:31:45.503] info <- base::paste(info, collapse = "; ") [15:31:45.503] if (!has_future) { [15:31:45.503] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:45.503] info) [15:31:45.503] } [15:31:45.503] else { [15:31:45.503] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:45.503] info, version) [15:31:45.503] } [15:31:45.503] base::stop(msg) [15:31:45.503] } [15:31:45.503] }) [15:31:45.503] } [15:31:45.503] ...future.strategy.old <- future::plan("list") [15:31:45.503] options(future.plan = NULL) [15:31:45.503] Sys.unsetenv("R_FUTURE_PLAN") [15:31:45.503] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:45.503] } [15:31:45.503] ...future.workdir <- getwd() [15:31:45.503] } [15:31:45.503] ...future.oldOptions <- base::as.list(base::.Options) [15:31:45.503] ...future.oldEnvVars <- base::Sys.getenv() [15:31:45.503] } [15:31:45.503] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:45.503] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:45.503] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:45.503] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:45.503] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:45.503] future.stdout.windows.reencode = NULL, width = 80L) [15:31:45.503] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:45.503] base::names(...future.oldOptions)) [15:31:45.503] } [15:31:45.503] if (FALSE) { [15:31:45.503] } [15:31:45.503] else { [15:31:45.503] if (TRUE) { [15:31:45.503] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:45.503] open = "w") [15:31:45.503] } [15:31:45.503] else { [15:31:45.503] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:45.503] windows = "NUL", "/dev/null"), open = "w") [15:31:45.503] } [15:31:45.503] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:45.503] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:45.503] base::sink(type = "output", split = FALSE) [15:31:45.503] base::close(...future.stdout) [15:31:45.503] }, add = TRUE) [15:31:45.503] } [15:31:45.503] ...future.frame <- base::sys.nframe() [15:31:45.503] ...future.conditions <- base::list() [15:31:45.503] ...future.rng <- base::globalenv()$.Random.seed [15:31:45.503] if (FALSE) { [15:31:45.503] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:45.503] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:45.503] } [15:31:45.503] ...future.result <- base::tryCatch({ [15:31:45.503] base::withCallingHandlers({ [15:31:45.503] ...future.value <- base::withVisible(base::local({ [15:31:45.503] do.call(function(...) { [15:31:45.503] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.503] if (!identical(...future.globals.maxSize.org, [15:31:45.503] ...future.globals.maxSize)) { [15:31:45.503] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.503] on.exit(options(oopts), add = TRUE) [15:31:45.503] } [15:31:45.503] { [15:31:45.503] lapply(seq_along(...future.elements_ii), [15:31:45.503] FUN = function(jj) { [15:31:45.503] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.503] ...future.FUN(...future.X_jj, ...) [15:31:45.503] }) [15:31:45.503] } [15:31:45.503] }, args = future.call.arguments) [15:31:45.503] })) [15:31:45.503] future::FutureResult(value = ...future.value$value, [15:31:45.503] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:45.503] ...future.rng), globalenv = if (FALSE) [15:31:45.503] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:45.503] ...future.globalenv.names)) [15:31:45.503] else NULL, started = ...future.startTime, version = "1.8") [15:31:45.503] }, condition = base::local({ [15:31:45.503] c <- base::c [15:31:45.503] inherits <- base::inherits [15:31:45.503] invokeRestart <- base::invokeRestart [15:31:45.503] length <- base::length [15:31:45.503] list <- base::list [15:31:45.503] seq.int <- base::seq.int [15:31:45.503] signalCondition <- base::signalCondition [15:31:45.503] sys.calls <- base::sys.calls [15:31:45.503] `[[` <- base::`[[` [15:31:45.503] `+` <- base::`+` [15:31:45.503] `<<-` <- base::`<<-` [15:31:45.503] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:45.503] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:45.503] 3L)] [15:31:45.503] } [15:31:45.503] function(cond) { [15:31:45.503] is_error <- inherits(cond, "error") [15:31:45.503] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:45.503] NULL) [15:31:45.503] if (is_error) { [15:31:45.503] sessionInformation <- function() { [15:31:45.503] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:45.503] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:45.503] search = base::search(), system = base::Sys.info()) [15:31:45.503] } [15:31:45.503] ...future.conditions[[length(...future.conditions) + [15:31:45.503] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:45.503] cond$call), session = sessionInformation(), [15:31:45.503] timestamp = base::Sys.time(), signaled = 0L) [15:31:45.503] signalCondition(cond) [15:31:45.503] } [15:31:45.503] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:45.503] "immediateCondition"))) { [15:31:45.503] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:45.503] ...future.conditions[[length(...future.conditions) + [15:31:45.503] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:45.503] if (TRUE && !signal) { [15:31:45.503] muffleCondition <- function (cond, pattern = "^muffle") [15:31:45.503] { [15:31:45.503] inherits <- base::inherits [15:31:45.503] invokeRestart <- base::invokeRestart [15:31:45.503] is.null <- base::is.null [15:31:45.503] muffled <- FALSE [15:31:45.503] if (inherits(cond, "message")) { [15:31:45.503] muffled <- grepl(pattern, "muffleMessage") [15:31:45.503] if (muffled) [15:31:45.503] invokeRestart("muffleMessage") [15:31:45.503] } [15:31:45.503] else if (inherits(cond, "warning")) { [15:31:45.503] muffled <- grepl(pattern, "muffleWarning") [15:31:45.503] if (muffled) [15:31:45.503] invokeRestart("muffleWarning") [15:31:45.503] } [15:31:45.503] else if (inherits(cond, "condition")) { [15:31:45.503] if (!is.null(pattern)) { [15:31:45.503] computeRestarts <- base::computeRestarts [15:31:45.503] grepl <- base::grepl [15:31:45.503] restarts <- computeRestarts(cond) [15:31:45.503] for (restart in restarts) { [15:31:45.503] name <- restart$name [15:31:45.503] if (is.null(name)) [15:31:45.503] next [15:31:45.503] if (!grepl(pattern, name)) [15:31:45.503] next [15:31:45.503] invokeRestart(restart) [15:31:45.503] muffled <- TRUE [15:31:45.503] break [15:31:45.503] } [15:31:45.503] } [15:31:45.503] } [15:31:45.503] invisible(muffled) [15:31:45.503] } [15:31:45.503] muffleCondition(cond, pattern = "^muffle") [15:31:45.503] } [15:31:45.503] } [15:31:45.503] else { [15:31:45.503] if (TRUE) { [15:31:45.503] muffleCondition <- function (cond, pattern = "^muffle") [15:31:45.503] { [15:31:45.503] inherits <- base::inherits [15:31:45.503] invokeRestart <- base::invokeRestart [15:31:45.503] is.null <- base::is.null [15:31:45.503] muffled <- FALSE [15:31:45.503] if (inherits(cond, "message")) { [15:31:45.503] muffled <- grepl(pattern, "muffleMessage") [15:31:45.503] if (muffled) [15:31:45.503] invokeRestart("muffleMessage") [15:31:45.503] } [15:31:45.503] else if (inherits(cond, "warning")) { [15:31:45.503] muffled <- grepl(pattern, "muffleWarning") [15:31:45.503] if (muffled) [15:31:45.503] invokeRestart("muffleWarning") [15:31:45.503] } [15:31:45.503] else if (inherits(cond, "condition")) { [15:31:45.503] if (!is.null(pattern)) { [15:31:45.503] computeRestarts <- base::computeRestarts [15:31:45.503] grepl <- base::grepl [15:31:45.503] restarts <- computeRestarts(cond) [15:31:45.503] for (restart in restarts) { [15:31:45.503] name <- restart$name [15:31:45.503] if (is.null(name)) [15:31:45.503] next [15:31:45.503] if (!grepl(pattern, name)) [15:31:45.503] next [15:31:45.503] invokeRestart(restart) [15:31:45.503] muffled <- TRUE [15:31:45.503] break [15:31:45.503] } [15:31:45.503] } [15:31:45.503] } [15:31:45.503] invisible(muffled) [15:31:45.503] } [15:31:45.503] muffleCondition(cond, pattern = "^muffle") [15:31:45.503] } [15:31:45.503] } [15:31:45.503] } [15:31:45.503] })) [15:31:45.503] }, error = function(ex) { [15:31:45.503] base::structure(base::list(value = NULL, visible = NULL, [15:31:45.503] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:45.503] ...future.rng), started = ...future.startTime, [15:31:45.503] finished = Sys.time(), session_uuid = NA_character_, [15:31:45.503] version = "1.8"), class = "FutureResult") [15:31:45.503] }, finally = { [15:31:45.503] if (!identical(...future.workdir, getwd())) [15:31:45.503] setwd(...future.workdir) [15:31:45.503] { [15:31:45.503] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:45.503] ...future.oldOptions$nwarnings <- NULL [15:31:45.503] } [15:31:45.503] base::options(...future.oldOptions) [15:31:45.503] if (.Platform$OS.type == "windows") { [15:31:45.503] old_names <- names(...future.oldEnvVars) [15:31:45.503] envs <- base::Sys.getenv() [15:31:45.503] names <- names(envs) [15:31:45.503] common <- intersect(names, old_names) [15:31:45.503] added <- setdiff(names, old_names) [15:31:45.503] removed <- setdiff(old_names, names) [15:31:45.503] changed <- common[...future.oldEnvVars[common] != [15:31:45.503] envs[common]] [15:31:45.503] NAMES <- toupper(changed) [15:31:45.503] args <- list() [15:31:45.503] for (kk in seq_along(NAMES)) { [15:31:45.503] name <- changed[[kk]] [15:31:45.503] NAME <- NAMES[[kk]] [15:31:45.503] if (name != NAME && is.element(NAME, old_names)) [15:31:45.503] next [15:31:45.503] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:45.503] } [15:31:45.503] NAMES <- toupper(added) [15:31:45.503] for (kk in seq_along(NAMES)) { [15:31:45.503] name <- added[[kk]] [15:31:45.503] NAME <- NAMES[[kk]] [15:31:45.503] if (name != NAME && is.element(NAME, old_names)) [15:31:45.503] next [15:31:45.503] args[[name]] <- "" [15:31:45.503] } [15:31:45.503] NAMES <- toupper(removed) [15:31:45.503] for (kk in seq_along(NAMES)) { [15:31:45.503] name <- removed[[kk]] [15:31:45.503] NAME <- NAMES[[kk]] [15:31:45.503] if (name != NAME && is.element(NAME, old_names)) [15:31:45.503] next [15:31:45.503] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:45.503] } [15:31:45.503] if (length(args) > 0) [15:31:45.503] base::do.call(base::Sys.setenv, args = args) [15:31:45.503] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:45.503] } [15:31:45.503] else { [15:31:45.503] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:45.503] } [15:31:45.503] { [15:31:45.503] if (base::length(...future.futureOptionsAdded) > [15:31:45.503] 0L) { [15:31:45.503] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:45.503] base::names(opts) <- ...future.futureOptionsAdded [15:31:45.503] base::options(opts) [15:31:45.503] } [15:31:45.503] { [15:31:45.503] { [15:31:45.503] NULL [15:31:45.503] RNGkind("Mersenne-Twister") [15:31:45.503] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:45.503] inherits = FALSE) [15:31:45.503] } [15:31:45.503] options(future.plan = NULL) [15:31:45.503] if (is.na(NA_character_)) [15:31:45.503] Sys.unsetenv("R_FUTURE_PLAN") [15:31:45.503] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:45.503] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:45.503] .init = FALSE) [15:31:45.503] } [15:31:45.503] } [15:31:45.503] } [15:31:45.503] }) [15:31:45.503] if (TRUE) { [15:31:45.503] base::sink(type = "output", split = FALSE) [15:31:45.503] if (TRUE) { [15:31:45.503] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:45.503] } [15:31:45.503] else { [15:31:45.503] ...future.result["stdout"] <- base::list(NULL) [15:31:45.503] } [15:31:45.503] base::close(...future.stdout) [15:31:45.503] ...future.stdout <- NULL [15:31:45.503] } [15:31:45.503] ...future.result$conditions <- ...future.conditions [15:31:45.503] ...future.result$finished <- base::Sys.time() [15:31:45.503] ...future.result [15:31:45.503] } [15:31:45.510] assign_globals() ... [15:31:45.510] List of 5 [15:31:45.510] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:45.510] $ future.call.arguments :List of 1 [15:31:45.510] ..$ length: int 2 [15:31:45.510] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:45.510] $ ...future.elements_ii :List of 1 [15:31:45.510] ..$ c: chr "list" [15:31:45.510] $ ...future.seeds_ii : NULL [15:31:45.510] $ ...future.globals.maxSize: NULL [15:31:45.510] - attr(*, "where")=List of 5 [15:31:45.510] ..$ ...future.FUN : [15:31:45.510] ..$ future.call.arguments : [15:31:45.510] ..$ ...future.elements_ii : [15:31:45.510] ..$ ...future.seeds_ii : [15:31:45.510] ..$ ...future.globals.maxSize: [15:31:45.510] - attr(*, "resolved")= logi FALSE [15:31:45.510] - attr(*, "total_size")= num 2240 [15:31:45.510] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:45.510] - attr(*, "already-done")= logi TRUE [15:31:45.520] - copied '...future.FUN' to environment [15:31:45.521] - copied 'future.call.arguments' to environment [15:31:45.521] - copied '...future.elements_ii' to environment [15:31:45.521] - copied '...future.seeds_ii' to environment [15:31:45.522] - copied '...future.globals.maxSize' to environment [15:31:45.522] assign_globals() ... done [15:31:45.523] plan(): Setting new future strategy stack: [15:31:45.523] List of future strategies: [15:31:45.523] 1. sequential: [15:31:45.523] - args: function (..., envir = parent.frame(), workers = "") [15:31:45.523] - tweaked: FALSE [15:31:45.523] - call: NULL [15:31:45.524] plan(): nbrOfWorkers() = 1 [15:31:45.526] plan(): Setting new future strategy stack: [15:31:45.526] List of future strategies: [15:31:45.526] 1. sequential: [15:31:45.526] - args: function (..., envir = parent.frame(), workers = "") [15:31:45.526] - tweaked: FALSE [15:31:45.526] - call: plan(strategy) [15:31:45.527] plan(): nbrOfWorkers() = 1 [15:31:45.528] SequentialFuture started (and completed) [15:31:45.528] - Launch lazy future ... done [15:31:45.528] run() for 'SequentialFuture' ... done [15:31:45.529] Created future: [15:31:45.529] SequentialFuture: [15:31:45.529] Label: 'future_lapply-4' [15:31:45.529] Expression: [15:31:45.529] { [15:31:45.529] do.call(function(...) { [15:31:45.529] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.529] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:45.529] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.529] on.exit(options(oopts), add = TRUE) [15:31:45.529] } [15:31:45.529] { [15:31:45.529] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:45.529] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.529] ...future.FUN(...future.X_jj, ...) [15:31:45.529] }) [15:31:45.529] } [15:31:45.529] }, args = future.call.arguments) [15:31:45.529] } [15:31:45.529] Lazy evaluation: FALSE [15:31:45.529] Asynchronous evaluation: FALSE [15:31:45.529] Local evaluation: TRUE [15:31:45.529] Environment: R_GlobalEnv [15:31:45.529] Capture standard output: TRUE [15:31:45.529] Capture condition classes: 'condition' (excluding 'nothing') [15:31:45.529] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:45.529] Packages: [15:31:45.529] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:45.529] Resolved: TRUE [15:31:45.529] Value: 0 bytes of class 'list' [15:31:45.529] Early signaling: FALSE [15:31:45.529] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:45.529] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:45.531] Chunk #4 of 4 ... DONE [15:31:45.531] Launching 4 futures (chunks) ... DONE [15:31:45.532] Resolving 4 futures (chunks) ... [15:31:45.532] resolve() on list ... [15:31:45.532] recursive: 0 [15:31:45.533] length: 4 [15:31:45.533] [15:31:45.533] resolved() for 'SequentialFuture' ... [15:31:45.534] - state: 'finished' [15:31:45.534] - run: TRUE [15:31:45.534] - result: 'FutureResult' [15:31:45.535] resolved() for 'SequentialFuture' ... done [15:31:45.535] Future #1 [15:31:45.535] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:45.536] - nx: 4 [15:31:45.536] - relay: TRUE [15:31:45.536] - stdout: TRUE [15:31:45.536] - signal: TRUE [15:31:45.537] - resignal: FALSE [15:31:45.537] - force: TRUE [15:31:45.537] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [15:31:45.538] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [15:31:45.538] - until=1 [15:31:45.538] - relaying element #1 [15:31:45.539] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:45.541] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:45.542] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:45.542] length: 3 (resolved future 1) [15:31:45.542] resolved() for 'SequentialFuture' ... [15:31:45.543] - state: 'finished' [15:31:45.543] - run: TRUE [15:31:45.543] - result: 'FutureResult' [15:31:45.544] resolved() for 'SequentialFuture' ... done [15:31:45.544] Future #2 [15:31:45.545] signalConditionsASAP(SequentialFuture, pos=2) ... [15:31:45.545] - nx: 4 [15:31:45.545] - relay: TRUE [15:31:45.546] - stdout: TRUE [15:31:45.546] - signal: TRUE [15:31:45.546] - resignal: FALSE [15:31:45.546] - force: TRUE [15:31:45.547] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:45.547] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:45.547] - until=2 [15:31:45.548] - relaying element #2 [15:31:45.548] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:45.548] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:45.549] signalConditionsASAP(SequentialFuture, pos=2) ... done [15:31:45.549] length: 2 (resolved future 2) [15:31:45.549] resolved() for 'SequentialFuture' ... [15:31:45.550] - state: 'finished' [15:31:45.550] - run: TRUE [15:31:45.550] - result: 'FutureResult' [15:31:45.551] resolved() for 'SequentialFuture' ... done [15:31:45.551] Future #3 [15:31:45.551] signalConditionsASAP(SequentialFuture, pos=3) ... [15:31:45.552] - nx: 4 [15:31:45.552] - relay: TRUE [15:31:45.552] - stdout: TRUE [15:31:45.553] - signal: TRUE [15:31:45.553] - resignal: FALSE [15:31:45.553] - force: TRUE [15:31:45.553] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:45.554] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:45.554] - until=3 [15:31:45.554] - relaying element #3 [15:31:45.555] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:45.555] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:45.555] signalConditionsASAP(SequentialFuture, pos=3) ... done [15:31:45.556] length: 1 (resolved future 3) [15:31:45.556] resolved() for 'SequentialFuture' ... [15:31:45.556] - state: 'finished' [15:31:45.557] - run: TRUE [15:31:45.557] - result: 'FutureResult' [15:31:45.557] resolved() for 'SequentialFuture' ... done [15:31:45.558] Future #4 [15:31:45.558] signalConditionsASAP(SequentialFuture, pos=4) ... [15:31:45.558] - nx: 4 [15:31:45.559] - relay: TRUE [15:31:45.559] - stdout: TRUE [15:31:45.559] - signal: TRUE [15:31:45.559] - resignal: FALSE [15:31:45.560] - force: TRUE [15:31:45.560] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:45.560] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:45.560] - until=4 [15:31:45.561] - relaying element #4 [15:31:45.561] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:45.562] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:45.562] signalConditionsASAP(SequentialFuture, pos=4) ... done [15:31:45.562] length: 0 (resolved future 4) [15:31:45.562] Relaying remaining futures [15:31:45.563] signalConditionsASAP(NULL, pos=0) ... [15:31:45.563] - nx: 4 [15:31:45.563] - relay: TRUE [15:31:45.564] - stdout: TRUE [15:31:45.564] - signal: TRUE [15:31:45.564] - resignal: FALSE [15:31:45.564] - force: TRUE [15:31:45.565] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:45.565] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [15:31:45.565] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:45.566] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:45.566] signalConditionsASAP(NULL, pos=0) ... done [15:31:45.566] resolve() on list ... DONE [15:31:45.567] - Number of value chunks collected: 4 [15:31:45.567] Resolving 4 futures (chunks) ... DONE [15:31:45.568] Reducing values from 4 chunks ... [15:31:45.568] - Number of values collected after concatenation: 4 [15:31:45.568] - Number of values expected: 4 [15:31:45.568] Reducing values from 4 chunks ... DONE [15:31:45.569] 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, ...) ... [15:31:45.573] future_lapply() ... [15:31:45.597] Number of chunks: 1 [15:31:45.597] getGlobalsAndPackagesXApply() ... [15:31:45.597] - future.globals: TRUE [15:31:45.598] getGlobalsAndPackages() ... [15:31:45.598] Searching for globals... [15:31:45.615] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [15:31:45.616] Searching for globals ... DONE [15:31:45.616] Resolving globals: FALSE [15:31:45.618] The total size of the 1 globals is 69.62 KiB (71288 bytes) [15:31:45.619] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 69.62 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (69.62 KiB of class 'function') [15:31:45.619] - globals: [1] 'FUN' [15:31:45.619] - packages: [1] 'future' [15:31:45.619] getGlobalsAndPackages() ... DONE [15:31:45.620] - globals found/used: [n=1] 'FUN' [15:31:45.620] - needed namespaces: [n=1] 'future' [15:31:45.620] Finding globals ... DONE [15:31:45.621] - use_args: TRUE [15:31:45.621] - Getting '...' globals ... [15:31:45.621] resolve() on list ... [15:31:45.622] recursive: 0 [15:31:45.622] length: 1 [15:31:45.622] elements: '...' [15:31:45.623] length: 0 (resolved future 1) [15:31:45.623] resolve() on list ... DONE [15:31:45.623] - '...' content: [n=2] 'collapse', 'maxHead' [15:31:45.624] List of 1 [15:31:45.624] $ ...:List of 2 [15:31:45.624] ..$ collapse: chr "; " [15:31:45.624] ..$ maxHead : int 3 [15:31:45.624] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:45.624] - attr(*, "where")=List of 1 [15:31:45.624] ..$ ...: [15:31:45.624] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:45.624] - attr(*, "resolved")= logi TRUE [15:31:45.624] - attr(*, "total_size")= num NA [15:31:45.632] - Getting '...' globals ... DONE [15:31:45.633] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:45.633] List of 2 [15:31:45.633] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:45.633] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:45.633] $ ... :List of 2 [15:31:45.633] ..$ collapse: chr "; " [15:31:45.633] ..$ maxHead : int 3 [15:31:45.633] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:45.633] - attr(*, "where")=List of 2 [15:31:45.633] ..$ ...future.FUN: [15:31:45.633] ..$ ... : [15:31:45.633] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:45.633] - attr(*, "resolved")= logi FALSE [15:31:45.633] - attr(*, "total_size")= num 71456 [15:31:45.640] Packages to be attached in all futures: [n=1] 'future' [15:31:45.640] getGlobalsAndPackagesXApply() ... DONE [15:31:45.640] Number of futures (= number of chunks): 1 [15:31:45.641] Launching 1 futures (chunks) ... [15:31:45.641] Chunk #1 of 1 ... [15:31:45.641] - Finding globals in 'X' for chunk #1 ... [15:31:45.642] getGlobalsAndPackages() ... [15:31:45.642] Searching for globals... [15:31:45.642] [15:31:45.643] Searching for globals ... DONE [15:31:45.643] - globals: [0] [15:31:45.643] getGlobalsAndPackages() ... DONE [15:31:45.643] + additional globals found: [n=0] [15:31:45.644] + additional namespaces needed: [n=0] [15:31:45.644] - Finding globals in 'X' for chunk #1 ... DONE [15:31:45.644] - seeds: [15:31:45.644] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.644] getGlobalsAndPackages() ... [15:31:45.645] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.645] Resolving globals: FALSE [15:31:45.645] Tweak future expression to call with '...' arguments ... [15:31:45.645] { [15:31:45.645] do.call(function(...) { [15:31:45.645] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.645] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:45.645] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.645] on.exit(options(oopts), add = TRUE) [15:31:45.645] } [15:31:45.645] { [15:31:45.645] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:45.645] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.645] ...future.FUN(...future.X_jj, ...) [15:31:45.645] }) [15:31:45.645] } [15:31:45.645] }, args = future.call.arguments) [15:31:45.645] } [15:31:45.646] Tweak future expression to call with '...' arguments ... DONE [15:31:45.647] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.648] - packages: [1] 'future' [15:31:45.648] getGlobalsAndPackages() ... DONE [15:31:45.649] run() for 'Future' ... [15:31:45.649] - state: 'created' [15:31:45.650] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:45.650] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:45.651] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:45.651] - Field: 'label' [15:31:45.651] - Field: 'local' [15:31:45.651] - Field: 'owner' [15:31:45.652] - Field: 'envir' [15:31:45.652] - Field: 'packages' [15:31:45.652] - Field: 'gc' [15:31:45.653] - Field: 'conditions' [15:31:45.653] - Field: 'expr' [15:31:45.653] - Field: 'uuid' [15:31:45.653] - Field: 'seed' [15:31:45.654] - Field: 'version' [15:31:45.654] - Field: 'result' [15:31:45.654] - Field: 'asynchronous' [15:31:45.654] - Field: 'calls' [15:31:45.655] - Field: 'globals' [15:31:45.655] - Field: 'stdout' [15:31:45.655] - Field: 'earlySignal' [15:31:45.656] - Field: 'lazy' [15:31:45.656] - Field: 'state' [15:31:45.656] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:45.656] - Launch lazy future ... [15:31:45.657] Packages needed by the future expression (n = 1): 'future' [15:31:45.657] Packages needed by future strategies (n = 0): [15:31:45.658] { [15:31:45.658] { [15:31:45.658] { [15:31:45.658] ...future.startTime <- base::Sys.time() [15:31:45.658] { [15:31:45.658] { [15:31:45.658] { [15:31:45.658] { [15:31:45.658] base::local({ [15:31:45.658] has_future <- base::requireNamespace("future", [15:31:45.658] quietly = TRUE) [15:31:45.658] if (has_future) { [15:31:45.658] ns <- base::getNamespace("future") [15:31:45.658] version <- ns[[".package"]][["version"]] [15:31:45.658] if (is.null(version)) [15:31:45.658] version <- utils::packageVersion("future") [15:31:45.658] } [15:31:45.658] else { [15:31:45.658] version <- NULL [15:31:45.658] } [15:31:45.658] if (!has_future || version < "1.8.0") { [15:31:45.658] info <- base::c(r_version = base::gsub("R version ", [15:31:45.658] "", base::R.version$version.string), [15:31:45.658] platform = base::sprintf("%s (%s-bit)", [15:31:45.658] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:45.658] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:45.658] "release", "version")], collapse = " "), [15:31:45.658] hostname = base::Sys.info()[["nodename"]]) [15:31:45.658] info <- base::sprintf("%s: %s", base::names(info), [15:31:45.658] info) [15:31:45.658] info <- base::paste(info, collapse = "; ") [15:31:45.658] if (!has_future) { [15:31:45.658] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:45.658] info) [15:31:45.658] } [15:31:45.658] else { [15:31:45.658] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:45.658] info, version) [15:31:45.658] } [15:31:45.658] base::stop(msg) [15:31:45.658] } [15:31:45.658] }) [15:31:45.658] } [15:31:45.658] base::local({ [15:31:45.658] for (pkg in "future") { [15:31:45.658] base::loadNamespace(pkg) [15:31:45.658] base::library(pkg, character.only = TRUE) [15:31:45.658] } [15:31:45.658] }) [15:31:45.658] } [15:31:45.658] ...future.strategy.old <- future::plan("list") [15:31:45.658] options(future.plan = NULL) [15:31:45.658] Sys.unsetenv("R_FUTURE_PLAN") [15:31:45.658] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:45.658] } [15:31:45.658] ...future.workdir <- getwd() [15:31:45.658] } [15:31:45.658] ...future.oldOptions <- base::as.list(base::.Options) [15:31:45.658] ...future.oldEnvVars <- base::Sys.getenv() [15:31:45.658] } [15:31:45.658] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:45.658] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:45.658] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:45.658] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:45.658] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:45.658] future.stdout.windows.reencode = NULL, width = 80L) [15:31:45.658] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:45.658] base::names(...future.oldOptions)) [15:31:45.658] } [15:31:45.658] if (FALSE) { [15:31:45.658] } [15:31:45.658] else { [15:31:45.658] if (TRUE) { [15:31:45.658] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:45.658] open = "w") [15:31:45.658] } [15:31:45.658] else { [15:31:45.658] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:45.658] windows = "NUL", "/dev/null"), open = "w") [15:31:45.658] } [15:31:45.658] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:45.658] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:45.658] base::sink(type = "output", split = FALSE) [15:31:45.658] base::close(...future.stdout) [15:31:45.658] }, add = TRUE) [15:31:45.658] } [15:31:45.658] ...future.frame <- base::sys.nframe() [15:31:45.658] ...future.conditions <- base::list() [15:31:45.658] ...future.rng <- base::globalenv()$.Random.seed [15:31:45.658] if (FALSE) { [15:31:45.658] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:45.658] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:45.658] } [15:31:45.658] ...future.result <- base::tryCatch({ [15:31:45.658] base::withCallingHandlers({ [15:31:45.658] ...future.value <- base::withVisible(base::local({ [15:31:45.658] do.call(function(...) { [15:31:45.658] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.658] if (!identical(...future.globals.maxSize.org, [15:31:45.658] ...future.globals.maxSize)) { [15:31:45.658] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.658] on.exit(options(oopts), add = TRUE) [15:31:45.658] } [15:31:45.658] { [15:31:45.658] lapply(seq_along(...future.elements_ii), [15:31:45.658] FUN = function(jj) { [15:31:45.658] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.658] ...future.FUN(...future.X_jj, ...) [15:31:45.658] }) [15:31:45.658] } [15:31:45.658] }, args = future.call.arguments) [15:31:45.658] })) [15:31:45.658] future::FutureResult(value = ...future.value$value, [15:31:45.658] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:45.658] ...future.rng), globalenv = if (FALSE) [15:31:45.658] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:45.658] ...future.globalenv.names)) [15:31:45.658] else NULL, started = ...future.startTime, version = "1.8") [15:31:45.658] }, condition = base::local({ [15:31:45.658] c <- base::c [15:31:45.658] inherits <- base::inherits [15:31:45.658] invokeRestart <- base::invokeRestart [15:31:45.658] length <- base::length [15:31:45.658] list <- base::list [15:31:45.658] seq.int <- base::seq.int [15:31:45.658] signalCondition <- base::signalCondition [15:31:45.658] sys.calls <- base::sys.calls [15:31:45.658] `[[` <- base::`[[` [15:31:45.658] `+` <- base::`+` [15:31:45.658] `<<-` <- base::`<<-` [15:31:45.658] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:45.658] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:45.658] 3L)] [15:31:45.658] } [15:31:45.658] function(cond) { [15:31:45.658] is_error <- inherits(cond, "error") [15:31:45.658] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:45.658] NULL) [15:31:45.658] if (is_error) { [15:31:45.658] sessionInformation <- function() { [15:31:45.658] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:45.658] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:45.658] search = base::search(), system = base::Sys.info()) [15:31:45.658] } [15:31:45.658] ...future.conditions[[length(...future.conditions) + [15:31:45.658] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:45.658] cond$call), session = sessionInformation(), [15:31:45.658] timestamp = base::Sys.time(), signaled = 0L) [15:31:45.658] signalCondition(cond) [15:31:45.658] } [15:31:45.658] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:45.658] "immediateCondition"))) { [15:31:45.658] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:45.658] ...future.conditions[[length(...future.conditions) + [15:31:45.658] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:45.658] if (TRUE && !signal) { [15:31:45.658] muffleCondition <- function (cond, pattern = "^muffle") [15:31:45.658] { [15:31:45.658] inherits <- base::inherits [15:31:45.658] invokeRestart <- base::invokeRestart [15:31:45.658] is.null <- base::is.null [15:31:45.658] muffled <- FALSE [15:31:45.658] if (inherits(cond, "message")) { [15:31:45.658] muffled <- grepl(pattern, "muffleMessage") [15:31:45.658] if (muffled) [15:31:45.658] invokeRestart("muffleMessage") [15:31:45.658] } [15:31:45.658] else if (inherits(cond, "warning")) { [15:31:45.658] muffled <- grepl(pattern, "muffleWarning") [15:31:45.658] if (muffled) [15:31:45.658] invokeRestart("muffleWarning") [15:31:45.658] } [15:31:45.658] else if (inherits(cond, "condition")) { [15:31:45.658] if (!is.null(pattern)) { [15:31:45.658] computeRestarts <- base::computeRestarts [15:31:45.658] grepl <- base::grepl [15:31:45.658] restarts <- computeRestarts(cond) [15:31:45.658] for (restart in restarts) { [15:31:45.658] name <- restart$name [15:31:45.658] if (is.null(name)) [15:31:45.658] next [15:31:45.658] if (!grepl(pattern, name)) [15:31:45.658] next [15:31:45.658] invokeRestart(restart) [15:31:45.658] muffled <- TRUE [15:31:45.658] break [15:31:45.658] } [15:31:45.658] } [15:31:45.658] } [15:31:45.658] invisible(muffled) [15:31:45.658] } [15:31:45.658] muffleCondition(cond, pattern = "^muffle") [15:31:45.658] } [15:31:45.658] } [15:31:45.658] else { [15:31:45.658] if (TRUE) { [15:31:45.658] muffleCondition <- function (cond, pattern = "^muffle") [15:31:45.658] { [15:31:45.658] inherits <- base::inherits [15:31:45.658] invokeRestart <- base::invokeRestart [15:31:45.658] is.null <- base::is.null [15:31:45.658] muffled <- FALSE [15:31:45.658] if (inherits(cond, "message")) { [15:31:45.658] muffled <- grepl(pattern, "muffleMessage") [15:31:45.658] if (muffled) [15:31:45.658] invokeRestart("muffleMessage") [15:31:45.658] } [15:31:45.658] else if (inherits(cond, "warning")) { [15:31:45.658] muffled <- grepl(pattern, "muffleWarning") [15:31:45.658] if (muffled) [15:31:45.658] invokeRestart("muffleWarning") [15:31:45.658] } [15:31:45.658] else if (inherits(cond, "condition")) { [15:31:45.658] if (!is.null(pattern)) { [15:31:45.658] computeRestarts <- base::computeRestarts [15:31:45.658] grepl <- base::grepl [15:31:45.658] restarts <- computeRestarts(cond) [15:31:45.658] for (restart in restarts) { [15:31:45.658] name <- restart$name [15:31:45.658] if (is.null(name)) [15:31:45.658] next [15:31:45.658] if (!grepl(pattern, name)) [15:31:45.658] next [15:31:45.658] invokeRestart(restart) [15:31:45.658] muffled <- TRUE [15:31:45.658] break [15:31:45.658] } [15:31:45.658] } [15:31:45.658] } [15:31:45.658] invisible(muffled) [15:31:45.658] } [15:31:45.658] muffleCondition(cond, pattern = "^muffle") [15:31:45.658] } [15:31:45.658] } [15:31:45.658] } [15:31:45.658] })) [15:31:45.658] }, error = function(ex) { [15:31:45.658] base::structure(base::list(value = NULL, visible = NULL, [15:31:45.658] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:45.658] ...future.rng), started = ...future.startTime, [15:31:45.658] finished = Sys.time(), session_uuid = NA_character_, [15:31:45.658] version = "1.8"), class = "FutureResult") [15:31:45.658] }, finally = { [15:31:45.658] if (!identical(...future.workdir, getwd())) [15:31:45.658] setwd(...future.workdir) [15:31:45.658] { [15:31:45.658] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:45.658] ...future.oldOptions$nwarnings <- NULL [15:31:45.658] } [15:31:45.658] base::options(...future.oldOptions) [15:31:45.658] if (.Platform$OS.type == "windows") { [15:31:45.658] old_names <- names(...future.oldEnvVars) [15:31:45.658] envs <- base::Sys.getenv() [15:31:45.658] names <- names(envs) [15:31:45.658] common <- intersect(names, old_names) [15:31:45.658] added <- setdiff(names, old_names) [15:31:45.658] removed <- setdiff(old_names, names) [15:31:45.658] changed <- common[...future.oldEnvVars[common] != [15:31:45.658] envs[common]] [15:31:45.658] NAMES <- toupper(changed) [15:31:45.658] args <- list() [15:31:45.658] for (kk in seq_along(NAMES)) { [15:31:45.658] name <- changed[[kk]] [15:31:45.658] NAME <- NAMES[[kk]] [15:31:45.658] if (name != NAME && is.element(NAME, old_names)) [15:31:45.658] next [15:31:45.658] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:45.658] } [15:31:45.658] NAMES <- toupper(added) [15:31:45.658] for (kk in seq_along(NAMES)) { [15:31:45.658] name <- added[[kk]] [15:31:45.658] NAME <- NAMES[[kk]] [15:31:45.658] if (name != NAME && is.element(NAME, old_names)) [15:31:45.658] next [15:31:45.658] args[[name]] <- "" [15:31:45.658] } [15:31:45.658] NAMES <- toupper(removed) [15:31:45.658] for (kk in seq_along(NAMES)) { [15:31:45.658] name <- removed[[kk]] [15:31:45.658] NAME <- NAMES[[kk]] [15:31:45.658] if (name != NAME && is.element(NAME, old_names)) [15:31:45.658] next [15:31:45.658] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:45.658] } [15:31:45.658] if (length(args) > 0) [15:31:45.658] base::do.call(base::Sys.setenv, args = args) [15:31:45.658] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:45.658] } [15:31:45.658] else { [15:31:45.658] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:45.658] } [15:31:45.658] { [15:31:45.658] if (base::length(...future.futureOptionsAdded) > [15:31:45.658] 0L) { [15:31:45.658] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:45.658] base::names(opts) <- ...future.futureOptionsAdded [15:31:45.658] base::options(opts) [15:31:45.658] } [15:31:45.658] { [15:31:45.658] { [15:31:45.658] NULL [15:31:45.658] RNGkind("Mersenne-Twister") [15:31:45.658] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:45.658] inherits = FALSE) [15:31:45.658] } [15:31:45.658] options(future.plan = NULL) [15:31:45.658] if (is.na(NA_character_)) [15:31:45.658] Sys.unsetenv("R_FUTURE_PLAN") [15:31:45.658] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:45.658] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:45.658] .init = FALSE) [15:31:45.658] } [15:31:45.658] } [15:31:45.658] } [15:31:45.658] }) [15:31:45.658] if (TRUE) { [15:31:45.658] base::sink(type = "output", split = FALSE) [15:31:45.658] if (TRUE) { [15:31:45.658] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:45.658] } [15:31:45.658] else { [15:31:45.658] ...future.result["stdout"] <- base::list(NULL) [15:31:45.658] } [15:31:45.658] base::close(...future.stdout) [15:31:45.658] ...future.stdout <- NULL [15:31:45.658] } [15:31:45.658] ...future.result$conditions <- ...future.conditions [15:31:45.658] ...future.result$finished <- base::Sys.time() [15:31:45.658] ...future.result [15:31:45.658] } [15:31:45.664] assign_globals() ... [15:31:45.664] List of 5 [15:31:45.664] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:45.664] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:45.664] $ future.call.arguments :List of 2 [15:31:45.664] ..$ collapse: chr "; " [15:31:45.664] ..$ maxHead : int 3 [15:31:45.664] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:45.664] $ ...future.elements_ii :List of 1 [15:31:45.664] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [15:31:45.664] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [15:31:45.664] $ ...future.seeds_ii : NULL [15:31:45.664] $ ...future.globals.maxSize: NULL [15:31:45.664] - attr(*, "where")=List of 5 [15:31:45.664] ..$ ...future.FUN : [15:31:45.664] ..$ future.call.arguments : [15:31:45.664] ..$ ...future.elements_ii : [15:31:45.664] ..$ ...future.seeds_ii : [15:31:45.664] ..$ ...future.globals.maxSize: [15:31:45.664] - attr(*, "resolved")= logi FALSE [15:31:45.664] - attr(*, "total_size")= num 71456 [15:31:45.664] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:45.664] - attr(*, "already-done")= logi TRUE [15:31:45.682] - copied '...future.FUN' to environment [15:31:45.682] - copied 'future.call.arguments' to environment [15:31:45.683] - copied '...future.elements_ii' to environment [15:31:45.683] - copied '...future.seeds_ii' to environment [15:31:45.683] - copied '...future.globals.maxSize' to environment [15:31:45.684] assign_globals() ... done [15:31:45.685] plan(): Setting new future strategy stack: [15:31:45.685] List of future strategies: [15:31:45.685] 1. sequential: [15:31:45.685] - args: function (..., envir = parent.frame(), workers = "") [15:31:45.685] - tweaked: FALSE [15:31:45.685] - call: NULL [15:31:45.687] plan(): nbrOfWorkers() = 1 [15:31:45.689] plan(): Setting new future strategy stack: [15:31:45.690] List of future strategies: [15:31:45.690] 1. sequential: [15:31:45.690] - args: function (..., envir = parent.frame(), workers = "") [15:31:45.690] - tweaked: FALSE [15:31:45.690] - call: plan(strategy) [15:31:45.691] plan(): nbrOfWorkers() = 1 [15:31:45.691] SequentialFuture started (and completed) [15:31:45.692] - Launch lazy future ... done [15:31:45.692] run() for 'SequentialFuture' ... done [15:31:45.692] Created future: [15:31:45.693] SequentialFuture: [15:31:45.693] Label: 'future_lapply-1' [15:31:45.693] Expression: [15:31:45.693] { [15:31:45.693] do.call(function(...) { [15:31:45.693] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.693] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:45.693] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.693] on.exit(options(oopts), add = TRUE) [15:31:45.693] } [15:31:45.693] { [15:31:45.693] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:45.693] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.693] ...future.FUN(...future.X_jj, ...) [15:31:45.693] }) [15:31:45.693] } [15:31:45.693] }, args = future.call.arguments) [15:31:45.693] } [15:31:45.693] Lazy evaluation: FALSE [15:31:45.693] Asynchronous evaluation: FALSE [15:31:45.693] Local evaluation: TRUE [15:31:45.693] Environment: R_GlobalEnv [15:31:45.693] Capture standard output: TRUE [15:31:45.693] Capture condition classes: 'condition' (excluding 'nothing') [15:31:45.693] Globals: 5 objects totaling 82.61 KiB (function '...future.FUN' of 69.62 KiB, DotDotDotList 'future.call.arguments' of 168 bytes, list '...future.elements_ii' of 12.83 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:45.693] Packages: 1 packages ('future') [15:31:45.693] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:45.693] Resolved: TRUE [15:31:45.693] Value: 136 bytes of class 'list' [15:31:45.693] Early signaling: FALSE [15:31:45.693] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:45.693] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:45.695] Chunk #1 of 1 ... DONE [15:31:45.695] Launching 1 futures (chunks) ... DONE [15:31:45.696] Resolving 1 futures (chunks) ... [15:31:45.696] resolve() on list ... [15:31:45.696] recursive: 0 [15:31:45.696] length: 1 [15:31:45.697] [15:31:45.697] resolved() for 'SequentialFuture' ... [15:31:45.697] - state: 'finished' [15:31:45.698] - run: TRUE [15:31:45.698] - result: 'FutureResult' [15:31:45.698] resolved() for 'SequentialFuture' ... done [15:31:45.699] Future #1 [15:31:45.699] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:45.699] - nx: 1 [15:31:45.700] - relay: TRUE [15:31:45.700] - stdout: TRUE [15:31:45.700] - signal: TRUE [15:31:45.700] - resignal: FALSE [15:31:45.701] - force: TRUE [15:31:45.701] - relayed: [n=1] FALSE [15:31:45.701] - queued futures: [n=1] FALSE [15:31:45.701] - until=1 [15:31:45.702] - relaying element #1 [15:31:45.702] - relayed: [n=1] TRUE [15:31:45.702] - queued futures: [n=1] TRUE [15:31:45.703] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:45.703] length: 0 (resolved future 1) [15:31:45.703] Relaying remaining futures [15:31:45.704] signalConditionsASAP(NULL, pos=0) ... [15:31:45.704] - nx: 1 [15:31:45.704] - relay: TRUE [15:31:45.705] - stdout: TRUE [15:31:45.705] - signal: TRUE [15:31:45.705] - resignal: FALSE [15:31:45.706] - force: TRUE [15:31:45.706] - relayed: [n=1] TRUE [15:31:45.706] - queued futures: [n=1] TRUE - flush all [15:31:45.707] - relayed: [n=1] TRUE [15:31:45.707] - queued futures: [n=1] TRUE [15:31:45.707] signalConditionsASAP(NULL, pos=0) ... done [15:31:45.708] resolve() on list ... DONE [15:31:45.708] - Number of value chunks collected: 1 [15:31:45.709] Resolving 1 futures (chunks) ... DONE [15:31:45.709] Reducing values from 1 chunks ... [15:31:45.709] - Number of values collected after concatenation: 1 [15:31:45.710] - Number of values expected: 1 [15:31:45.710] Reducing values from 1 chunks ... DONE [15:31:45.710] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [15:31:45.714] future_lapply() ... [15:31:45.716] Number of chunks: 2 [15:31:45.716] getGlobalsAndPackagesXApply() ... [15:31:45.716] - future.globals: TRUE [15:31:45.716] getGlobalsAndPackages() ... [15:31:45.716] Searching for globals... [15:31:45.719] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [15:31:45.719] Searching for globals ... DONE [15:31:45.720] Resolving globals: FALSE [15:31:45.721] The total size of the 1 globals is 4.85 KiB (4968 bytes) [15:31:45.721] The total size of the 1 globals exported for future expression ('FUN()') is 4.85 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (4.85 KiB of class 'function') [15:31:45.722] - globals: [1] 'FUN' [15:31:45.722] - packages: [1] 'listenv' [15:31:45.723] getGlobalsAndPackages() ... DONE [15:31:45.723] - globals found/used: [n=1] 'FUN' [15:31:45.723] - needed namespaces: [n=1] 'listenv' [15:31:45.723] Finding globals ... DONE [15:31:45.724] - use_args: TRUE [15:31:45.724] - Getting '...' globals ... [15:31:45.725] resolve() on list ... [15:31:45.725] recursive: 0 [15:31:45.725] length: 1 [15:31:45.726] elements: '...' [15:31:45.726] length: 0 (resolved future 1) [15:31:45.726] resolve() on list ... DONE [15:31:45.727] - '...' content: [n=0] [15:31:45.727] List of 1 [15:31:45.727] $ ...: list() [15:31:45.727] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:45.727] - attr(*, "where")=List of 1 [15:31:45.727] ..$ ...: [15:31:45.727] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:45.727] - attr(*, "resolved")= logi TRUE [15:31:45.727] - attr(*, "total_size")= num NA [15:31:45.733] - Getting '...' globals ... DONE [15:31:45.733] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:45.736] List of 2 [15:31:45.736] $ ...future.FUN:function (x, ...) [15:31:45.736] $ ... : list() [15:31:45.736] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:45.736] - attr(*, "where")=List of 2 [15:31:45.736] ..$ ...future.FUN: [15:31:45.736] ..$ ... : [15:31:45.736] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:45.736] - attr(*, "resolved")= logi FALSE [15:31:45.736] - attr(*, "total_size")= num 4968 [15:31:45.743] Packages to be attached in all futures: [n=1] 'listenv' [15:31:45.743] getGlobalsAndPackagesXApply() ... DONE [15:31:45.743] Number of futures (= number of chunks): 2 [15:31:45.744] Launching 2 futures (chunks) ... [15:31:45.744] Chunk #1 of 2 ... [15:31:45.745] - Finding globals in 'X' for chunk #1 ... [15:31:45.745] getGlobalsAndPackages() ... [15:31:45.745] Searching for globals... [15:31:45.746] [15:31:45.746] Searching for globals ... DONE [15:31:45.747] - globals: [0] [15:31:45.747] getGlobalsAndPackages() ... DONE [15:31:45.747] + additional globals found: [n=0] [15:31:45.748] + additional namespaces needed: [n=0] [15:31:45.748] - Finding globals in 'X' for chunk #1 ... DONE [15:31:45.748] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:45.748] - seeds: [15:31:45.749] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.749] getGlobalsAndPackages() ... [15:31:45.749] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.750] Resolving globals: FALSE [15:31:45.750] Tweak future expression to call with '...' arguments ... [15:31:45.750] { [15:31:45.750] do.call(function(...) { [15:31:45.750] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.750] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:45.750] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.750] on.exit(options(oopts), add = TRUE) [15:31:45.750] } [15:31:45.750] { [15:31:45.750] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:45.750] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.750] ...future.FUN(...future.X_jj, ...) [15:31:45.750] }) [15:31:45.750] } [15:31:45.750] }, args = future.call.arguments) [15:31:45.750] } [15:31:45.751] Tweak future expression to call with '...' arguments ... DONE [15:31:45.752] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.752] - packages: [1] 'listenv' [15:31:45.753] getGlobalsAndPackages() ... DONE [15:31:45.753] run() for 'Future' ... [15:31:45.754] - state: 'created' [15:31:45.754] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:45.755] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:45.755] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:45.755] - Field: 'label' [15:31:45.756] - Field: 'local' [15:31:45.756] - Field: 'owner' [15:31:45.756] - Field: 'envir' [15:31:45.757] - Field: 'packages' [15:31:45.757] - Field: 'gc' [15:31:45.757] - Field: 'conditions' [15:31:45.757] - Field: 'expr' [15:31:45.758] - Field: 'uuid' [15:31:45.758] - Field: 'seed' [15:31:45.758] - Field: 'version' [15:31:45.759] - Field: 'result' [15:31:45.759] - Field: 'asynchronous' [15:31:45.759] - Field: 'calls' [15:31:45.760] - Field: 'globals' [15:31:45.760] - Field: 'stdout' [15:31:45.760] - Field: 'earlySignal' [15:31:45.760] - Field: 'lazy' [15:31:45.761] - Field: 'state' [15:31:45.761] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:45.761] - Launch lazy future ... [15:31:45.762] Packages needed by the future expression (n = 1): 'listenv' [15:31:45.762] Packages needed by future strategies (n = 0): [15:31:45.763] { [15:31:45.763] { [15:31:45.763] { [15:31:45.763] ...future.startTime <- base::Sys.time() [15:31:45.763] { [15:31:45.763] { [15:31:45.763] { [15:31:45.763] { [15:31:45.763] base::local({ [15:31:45.763] has_future <- base::requireNamespace("future", [15:31:45.763] quietly = TRUE) [15:31:45.763] if (has_future) { [15:31:45.763] ns <- base::getNamespace("future") [15:31:45.763] version <- ns[[".package"]][["version"]] [15:31:45.763] if (is.null(version)) [15:31:45.763] version <- utils::packageVersion("future") [15:31:45.763] } [15:31:45.763] else { [15:31:45.763] version <- NULL [15:31:45.763] } [15:31:45.763] if (!has_future || version < "1.8.0") { [15:31:45.763] info <- base::c(r_version = base::gsub("R version ", [15:31:45.763] "", base::R.version$version.string), [15:31:45.763] platform = base::sprintf("%s (%s-bit)", [15:31:45.763] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:45.763] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:45.763] "release", "version")], collapse = " "), [15:31:45.763] hostname = base::Sys.info()[["nodename"]]) [15:31:45.763] info <- base::sprintf("%s: %s", base::names(info), [15:31:45.763] info) [15:31:45.763] info <- base::paste(info, collapse = "; ") [15:31:45.763] if (!has_future) { [15:31:45.763] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:45.763] info) [15:31:45.763] } [15:31:45.763] else { [15:31:45.763] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:45.763] info, version) [15:31:45.763] } [15:31:45.763] base::stop(msg) [15:31:45.763] } [15:31:45.763] }) [15:31:45.763] } [15:31:45.763] base::local({ [15:31:45.763] for (pkg in "listenv") { [15:31:45.763] base::loadNamespace(pkg) [15:31:45.763] base::library(pkg, character.only = TRUE) [15:31:45.763] } [15:31:45.763] }) [15:31:45.763] } [15:31:45.763] ...future.strategy.old <- future::plan("list") [15:31:45.763] options(future.plan = NULL) [15:31:45.763] Sys.unsetenv("R_FUTURE_PLAN") [15:31:45.763] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:45.763] } [15:31:45.763] ...future.workdir <- getwd() [15:31:45.763] } [15:31:45.763] ...future.oldOptions <- base::as.list(base::.Options) [15:31:45.763] ...future.oldEnvVars <- base::Sys.getenv() [15:31:45.763] } [15:31:45.763] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:45.763] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:45.763] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:45.763] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:45.763] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:45.763] future.stdout.windows.reencode = NULL, width = 80L) [15:31:45.763] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:45.763] base::names(...future.oldOptions)) [15:31:45.763] } [15:31:45.763] if (FALSE) { [15:31:45.763] } [15:31:45.763] else { [15:31:45.763] if (TRUE) { [15:31:45.763] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:45.763] open = "w") [15:31:45.763] } [15:31:45.763] else { [15:31:45.763] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:45.763] windows = "NUL", "/dev/null"), open = "w") [15:31:45.763] } [15:31:45.763] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:45.763] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:45.763] base::sink(type = "output", split = FALSE) [15:31:45.763] base::close(...future.stdout) [15:31:45.763] }, add = TRUE) [15:31:45.763] } [15:31:45.763] ...future.frame <- base::sys.nframe() [15:31:45.763] ...future.conditions <- base::list() [15:31:45.763] ...future.rng <- base::globalenv()$.Random.seed [15:31:45.763] if (FALSE) { [15:31:45.763] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:45.763] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:45.763] } [15:31:45.763] ...future.result <- base::tryCatch({ [15:31:45.763] base::withCallingHandlers({ [15:31:45.763] ...future.value <- base::withVisible(base::local({ [15:31:45.763] do.call(function(...) { [15:31:45.763] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.763] if (!identical(...future.globals.maxSize.org, [15:31:45.763] ...future.globals.maxSize)) { [15:31:45.763] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.763] on.exit(options(oopts), add = TRUE) [15:31:45.763] } [15:31:45.763] { [15:31:45.763] lapply(seq_along(...future.elements_ii), [15:31:45.763] FUN = function(jj) { [15:31:45.763] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.763] ...future.FUN(...future.X_jj, ...) [15:31:45.763] }) [15:31:45.763] } [15:31:45.763] }, args = future.call.arguments) [15:31:45.763] })) [15:31:45.763] future::FutureResult(value = ...future.value$value, [15:31:45.763] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:45.763] ...future.rng), globalenv = if (FALSE) [15:31:45.763] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:45.763] ...future.globalenv.names)) [15:31:45.763] else NULL, started = ...future.startTime, version = "1.8") [15:31:45.763] }, condition = base::local({ [15:31:45.763] c <- base::c [15:31:45.763] inherits <- base::inherits [15:31:45.763] invokeRestart <- base::invokeRestart [15:31:45.763] length <- base::length [15:31:45.763] list <- base::list [15:31:45.763] seq.int <- base::seq.int [15:31:45.763] signalCondition <- base::signalCondition [15:31:45.763] sys.calls <- base::sys.calls [15:31:45.763] `[[` <- base::`[[` [15:31:45.763] `+` <- base::`+` [15:31:45.763] `<<-` <- base::`<<-` [15:31:45.763] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:45.763] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:45.763] 3L)] [15:31:45.763] } [15:31:45.763] function(cond) { [15:31:45.763] is_error <- inherits(cond, "error") [15:31:45.763] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:45.763] NULL) [15:31:45.763] if (is_error) { [15:31:45.763] sessionInformation <- function() { [15:31:45.763] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:45.763] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:45.763] search = base::search(), system = base::Sys.info()) [15:31:45.763] } [15:31:45.763] ...future.conditions[[length(...future.conditions) + [15:31:45.763] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:45.763] cond$call), session = sessionInformation(), [15:31:45.763] timestamp = base::Sys.time(), signaled = 0L) [15:31:45.763] signalCondition(cond) [15:31:45.763] } [15:31:45.763] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:45.763] "immediateCondition"))) { [15:31:45.763] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:45.763] ...future.conditions[[length(...future.conditions) + [15:31:45.763] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:45.763] if (TRUE && !signal) { [15:31:45.763] muffleCondition <- function (cond, pattern = "^muffle") [15:31:45.763] { [15:31:45.763] inherits <- base::inherits [15:31:45.763] invokeRestart <- base::invokeRestart [15:31:45.763] is.null <- base::is.null [15:31:45.763] muffled <- FALSE [15:31:45.763] if (inherits(cond, "message")) { [15:31:45.763] muffled <- grepl(pattern, "muffleMessage") [15:31:45.763] if (muffled) [15:31:45.763] invokeRestart("muffleMessage") [15:31:45.763] } [15:31:45.763] else if (inherits(cond, "warning")) { [15:31:45.763] muffled <- grepl(pattern, "muffleWarning") [15:31:45.763] if (muffled) [15:31:45.763] invokeRestart("muffleWarning") [15:31:45.763] } [15:31:45.763] else if (inherits(cond, "condition")) { [15:31:45.763] if (!is.null(pattern)) { [15:31:45.763] computeRestarts <- base::computeRestarts [15:31:45.763] grepl <- base::grepl [15:31:45.763] restarts <- computeRestarts(cond) [15:31:45.763] for (restart in restarts) { [15:31:45.763] name <- restart$name [15:31:45.763] if (is.null(name)) [15:31:45.763] next [15:31:45.763] if (!grepl(pattern, name)) [15:31:45.763] next [15:31:45.763] invokeRestart(restart) [15:31:45.763] muffled <- TRUE [15:31:45.763] break [15:31:45.763] } [15:31:45.763] } [15:31:45.763] } [15:31:45.763] invisible(muffled) [15:31:45.763] } [15:31:45.763] muffleCondition(cond, pattern = "^muffle") [15:31:45.763] } [15:31:45.763] } [15:31:45.763] else { [15:31:45.763] if (TRUE) { [15:31:45.763] muffleCondition <- function (cond, pattern = "^muffle") [15:31:45.763] { [15:31:45.763] inherits <- base::inherits [15:31:45.763] invokeRestart <- base::invokeRestart [15:31:45.763] is.null <- base::is.null [15:31:45.763] muffled <- FALSE [15:31:45.763] if (inherits(cond, "message")) { [15:31:45.763] muffled <- grepl(pattern, "muffleMessage") [15:31:45.763] if (muffled) [15:31:45.763] invokeRestart("muffleMessage") [15:31:45.763] } [15:31:45.763] else if (inherits(cond, "warning")) { [15:31:45.763] muffled <- grepl(pattern, "muffleWarning") [15:31:45.763] if (muffled) [15:31:45.763] invokeRestart("muffleWarning") [15:31:45.763] } [15:31:45.763] else if (inherits(cond, "condition")) { [15:31:45.763] if (!is.null(pattern)) { [15:31:45.763] computeRestarts <- base::computeRestarts [15:31:45.763] grepl <- base::grepl [15:31:45.763] restarts <- computeRestarts(cond) [15:31:45.763] for (restart in restarts) { [15:31:45.763] name <- restart$name [15:31:45.763] if (is.null(name)) [15:31:45.763] next [15:31:45.763] if (!grepl(pattern, name)) [15:31:45.763] next [15:31:45.763] invokeRestart(restart) [15:31:45.763] muffled <- TRUE [15:31:45.763] break [15:31:45.763] } [15:31:45.763] } [15:31:45.763] } [15:31:45.763] invisible(muffled) [15:31:45.763] } [15:31:45.763] muffleCondition(cond, pattern = "^muffle") [15:31:45.763] } [15:31:45.763] } [15:31:45.763] } [15:31:45.763] })) [15:31:45.763] }, error = function(ex) { [15:31:45.763] base::structure(base::list(value = NULL, visible = NULL, [15:31:45.763] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:45.763] ...future.rng), started = ...future.startTime, [15:31:45.763] finished = Sys.time(), session_uuid = NA_character_, [15:31:45.763] version = "1.8"), class = "FutureResult") [15:31:45.763] }, finally = { [15:31:45.763] if (!identical(...future.workdir, getwd())) [15:31:45.763] setwd(...future.workdir) [15:31:45.763] { [15:31:45.763] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:45.763] ...future.oldOptions$nwarnings <- NULL [15:31:45.763] } [15:31:45.763] base::options(...future.oldOptions) [15:31:45.763] if (.Platform$OS.type == "windows") { [15:31:45.763] old_names <- names(...future.oldEnvVars) [15:31:45.763] envs <- base::Sys.getenv() [15:31:45.763] names <- names(envs) [15:31:45.763] common <- intersect(names, old_names) [15:31:45.763] added <- setdiff(names, old_names) [15:31:45.763] removed <- setdiff(old_names, names) [15:31:45.763] changed <- common[...future.oldEnvVars[common] != [15:31:45.763] envs[common]] [15:31:45.763] NAMES <- toupper(changed) [15:31:45.763] args <- list() [15:31:45.763] for (kk in seq_along(NAMES)) { [15:31:45.763] name <- changed[[kk]] [15:31:45.763] NAME <- NAMES[[kk]] [15:31:45.763] if (name != NAME && is.element(NAME, old_names)) [15:31:45.763] next [15:31:45.763] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:45.763] } [15:31:45.763] NAMES <- toupper(added) [15:31:45.763] for (kk in seq_along(NAMES)) { [15:31:45.763] name <- added[[kk]] [15:31:45.763] NAME <- NAMES[[kk]] [15:31:45.763] if (name != NAME && is.element(NAME, old_names)) [15:31:45.763] next [15:31:45.763] args[[name]] <- "" [15:31:45.763] } [15:31:45.763] NAMES <- toupper(removed) [15:31:45.763] for (kk in seq_along(NAMES)) { [15:31:45.763] name <- removed[[kk]] [15:31:45.763] NAME <- NAMES[[kk]] [15:31:45.763] if (name != NAME && is.element(NAME, old_names)) [15:31:45.763] next [15:31:45.763] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:45.763] } [15:31:45.763] if (length(args) > 0) [15:31:45.763] base::do.call(base::Sys.setenv, args = args) [15:31:45.763] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:45.763] } [15:31:45.763] else { [15:31:45.763] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:45.763] } [15:31:45.763] { [15:31:45.763] if (base::length(...future.futureOptionsAdded) > [15:31:45.763] 0L) { [15:31:45.763] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:45.763] base::names(opts) <- ...future.futureOptionsAdded [15:31:45.763] base::options(opts) [15:31:45.763] } [15:31:45.763] { [15:31:45.763] { [15:31:45.763] NULL [15:31:45.763] RNGkind("Mersenne-Twister") [15:31:45.763] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:45.763] inherits = FALSE) [15:31:45.763] } [15:31:45.763] options(future.plan = NULL) [15:31:45.763] if (is.na(NA_character_)) [15:31:45.763] Sys.unsetenv("R_FUTURE_PLAN") [15:31:45.763] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:45.763] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:45.763] .init = FALSE) [15:31:45.763] } [15:31:45.763] } [15:31:45.763] } [15:31:45.763] }) [15:31:45.763] if (TRUE) { [15:31:45.763] base::sink(type = "output", split = FALSE) [15:31:45.763] if (TRUE) { [15:31:45.763] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:45.763] } [15:31:45.763] else { [15:31:45.763] ...future.result["stdout"] <- base::list(NULL) [15:31:45.763] } [15:31:45.763] base::close(...future.stdout) [15:31:45.763] ...future.stdout <- NULL [15:31:45.763] } [15:31:45.763] ...future.result$conditions <- ...future.conditions [15:31:45.763] ...future.result$finished <- base::Sys.time() [15:31:45.763] ...future.result [15:31:45.763] } [15:31:45.770] assign_globals() ... [15:31:45.770] List of 5 [15:31:45.770] $ ...future.FUN :function (x, ...) [15:31:45.770] $ future.call.arguments : list() [15:31:45.770] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:45.770] $ ...future.elements_ii :List of 1 [15:31:45.770] ..$ a:Classes 'listenv', 'environment' [15:31:45.770] $ ...future.seeds_ii : NULL [15:31:45.770] $ ...future.globals.maxSize: NULL [15:31:45.770] - attr(*, "where")=List of 5 [15:31:45.770] ..$ ...future.FUN : [15:31:45.770] ..$ future.call.arguments : [15:31:45.770] ..$ ...future.elements_ii : [15:31:45.770] ..$ ...future.seeds_ii : [15:31:45.770] ..$ ...future.globals.maxSize: [15:31:45.770] - attr(*, "resolved")= logi FALSE [15:31:45.770] - attr(*, "total_size")= num 4968 [15:31:45.770] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:45.770] - attr(*, "already-done")= logi TRUE [15:31:45.780] - copied '...future.FUN' to environment [15:31:45.780] - copied 'future.call.arguments' to environment [15:31:45.780] - copied '...future.elements_ii' to environment [15:31:45.780] - copied '...future.seeds_ii' to environment [15:31:45.781] - copied '...future.globals.maxSize' to environment [15:31:45.781] assign_globals() ... done [15:31:45.782] plan(): Setting new future strategy stack: [15:31:45.782] List of future strategies: [15:31:45.782] 1. sequential: [15:31:45.782] - args: function (..., envir = parent.frame(), workers = "") [15:31:45.782] - tweaked: FALSE [15:31:45.782] - call: NULL [15:31:45.783] plan(): nbrOfWorkers() = 1 [15:31:45.785] plan(): Setting new future strategy stack: [15:31:45.786] List of future strategies: [15:31:45.786] 1. sequential: [15:31:45.786] - args: function (..., envir = parent.frame(), workers = "") [15:31:45.786] - tweaked: FALSE [15:31:45.786] - call: plan(strategy) [15:31:45.789] plan(): nbrOfWorkers() = 1 [15:31:45.790] SequentialFuture started (and completed) [15:31:45.790] - Launch lazy future ... done [15:31:45.791] run() for 'SequentialFuture' ... done [15:31:45.791] Created future: [15:31:45.791] SequentialFuture: [15:31:45.791] Label: 'future_lapply-1' [15:31:45.791] Expression: [15:31:45.791] { [15:31:45.791] do.call(function(...) { [15:31:45.791] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.791] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:45.791] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.791] on.exit(options(oopts), add = TRUE) [15:31:45.791] } [15:31:45.791] { [15:31:45.791] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:45.791] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.791] ...future.FUN(...future.X_jj, ...) [15:31:45.791] }) [15:31:45.791] } [15:31:45.791] }, args = future.call.arguments) [15:31:45.791] } [15:31:45.791] Lazy evaluation: FALSE [15:31:45.791] Asynchronous evaluation: FALSE [15:31:45.791] Local evaluation: TRUE [15:31:45.791] Environment: R_GlobalEnv [15:31:45.791] Capture standard output: TRUE [15:31:45.791] Capture condition classes: 'condition' (excluding 'nothing') [15:31:45.791] Globals: 5 objects totaling 4.96 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:45.791] Packages: 1 packages ('listenv') [15:31:45.791] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:45.791] Resolved: TRUE [15:31:45.791] Value: 336 bytes of class 'list' [15:31:45.791] Early signaling: FALSE [15:31:45.791] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:45.791] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:45.794] Chunk #1 of 2 ... DONE [15:31:45.794] Chunk #2 of 2 ... [15:31:45.794] - Finding globals in 'X' for chunk #2 ... [15:31:45.795] getGlobalsAndPackages() ... [15:31:45.795] Searching for globals... [15:31:45.796] [15:31:45.796] Searching for globals ... DONE [15:31:45.796] - globals: [0] [15:31:45.797] getGlobalsAndPackages() ... DONE [15:31:45.797] + additional globals found: [n=0] [15:31:45.797] + additional namespaces needed: [n=0] [15:31:45.797] - Finding globals in 'X' for chunk #2 ... DONE [15:31:45.798] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:45.798] - seeds: [15:31:45.798] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.798] getGlobalsAndPackages() ... [15:31:45.799] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.799] Resolving globals: FALSE [15:31:45.799] Tweak future expression to call with '...' arguments ... [15:31:45.800] { [15:31:45.800] do.call(function(...) { [15:31:45.800] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.800] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:45.800] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.800] on.exit(options(oopts), add = TRUE) [15:31:45.800] } [15:31:45.800] { [15:31:45.800] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:45.800] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.800] ...future.FUN(...future.X_jj, ...) [15:31:45.800] }) [15:31:45.800] } [15:31:45.800] }, args = future.call.arguments) [15:31:45.800] } [15:31:45.800] Tweak future expression to call with '...' arguments ... DONE [15:31:45.801] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.802] - packages: [1] 'listenv' [15:31:45.802] getGlobalsAndPackages() ... DONE [15:31:45.802] run() for 'Future' ... [15:31:45.803] - state: 'created' [15:31:45.803] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:45.804] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:45.804] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:45.804] - Field: 'label' [15:31:45.805] - Field: 'local' [15:31:45.805] - Field: 'owner' [15:31:45.805] - Field: 'envir' [15:31:45.806] - Field: 'packages' [15:31:45.806] - Field: 'gc' [15:31:45.806] - Field: 'conditions' [15:31:45.806] - Field: 'expr' [15:31:45.807] - Field: 'uuid' [15:31:45.807] - Field: 'seed' [15:31:45.807] - Field: 'version' [15:31:45.808] - Field: 'result' [15:31:45.808] - Field: 'asynchronous' [15:31:45.808] - Field: 'calls' [15:31:45.809] - Field: 'globals' [15:31:45.809] - Field: 'stdout' [15:31:45.809] - Field: 'earlySignal' [15:31:45.809] - Field: 'lazy' [15:31:45.810] - Field: 'state' [15:31:45.810] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:45.810] - Launch lazy future ... [15:31:45.811] Packages needed by the future expression (n = 1): 'listenv' [15:31:45.811] Packages needed by future strategies (n = 0): [15:31:45.812] { [15:31:45.812] { [15:31:45.812] { [15:31:45.812] ...future.startTime <- base::Sys.time() [15:31:45.812] { [15:31:45.812] { [15:31:45.812] { [15:31:45.812] { [15:31:45.812] base::local({ [15:31:45.812] has_future <- base::requireNamespace("future", [15:31:45.812] quietly = TRUE) [15:31:45.812] if (has_future) { [15:31:45.812] ns <- base::getNamespace("future") [15:31:45.812] version <- ns[[".package"]][["version"]] [15:31:45.812] if (is.null(version)) [15:31:45.812] version <- utils::packageVersion("future") [15:31:45.812] } [15:31:45.812] else { [15:31:45.812] version <- NULL [15:31:45.812] } [15:31:45.812] if (!has_future || version < "1.8.0") { [15:31:45.812] info <- base::c(r_version = base::gsub("R version ", [15:31:45.812] "", base::R.version$version.string), [15:31:45.812] platform = base::sprintf("%s (%s-bit)", [15:31:45.812] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:45.812] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:45.812] "release", "version")], collapse = " "), [15:31:45.812] hostname = base::Sys.info()[["nodename"]]) [15:31:45.812] info <- base::sprintf("%s: %s", base::names(info), [15:31:45.812] info) [15:31:45.812] info <- base::paste(info, collapse = "; ") [15:31:45.812] if (!has_future) { [15:31:45.812] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:45.812] info) [15:31:45.812] } [15:31:45.812] else { [15:31:45.812] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:45.812] info, version) [15:31:45.812] } [15:31:45.812] base::stop(msg) [15:31:45.812] } [15:31:45.812] }) [15:31:45.812] } [15:31:45.812] base::local({ [15:31:45.812] for (pkg in "listenv") { [15:31:45.812] base::loadNamespace(pkg) [15:31:45.812] base::library(pkg, character.only = TRUE) [15:31:45.812] } [15:31:45.812] }) [15:31:45.812] } [15:31:45.812] ...future.strategy.old <- future::plan("list") [15:31:45.812] options(future.plan = NULL) [15:31:45.812] Sys.unsetenv("R_FUTURE_PLAN") [15:31:45.812] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:45.812] } [15:31:45.812] ...future.workdir <- getwd() [15:31:45.812] } [15:31:45.812] ...future.oldOptions <- base::as.list(base::.Options) [15:31:45.812] ...future.oldEnvVars <- base::Sys.getenv() [15:31:45.812] } [15:31:45.812] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:45.812] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:45.812] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:45.812] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:45.812] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:45.812] future.stdout.windows.reencode = NULL, width = 80L) [15:31:45.812] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:45.812] base::names(...future.oldOptions)) [15:31:45.812] } [15:31:45.812] if (FALSE) { [15:31:45.812] } [15:31:45.812] else { [15:31:45.812] if (TRUE) { [15:31:45.812] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:45.812] open = "w") [15:31:45.812] } [15:31:45.812] else { [15:31:45.812] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:45.812] windows = "NUL", "/dev/null"), open = "w") [15:31:45.812] } [15:31:45.812] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:45.812] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:45.812] base::sink(type = "output", split = FALSE) [15:31:45.812] base::close(...future.stdout) [15:31:45.812] }, add = TRUE) [15:31:45.812] } [15:31:45.812] ...future.frame <- base::sys.nframe() [15:31:45.812] ...future.conditions <- base::list() [15:31:45.812] ...future.rng <- base::globalenv()$.Random.seed [15:31:45.812] if (FALSE) { [15:31:45.812] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:45.812] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:45.812] } [15:31:45.812] ...future.result <- base::tryCatch({ [15:31:45.812] base::withCallingHandlers({ [15:31:45.812] ...future.value <- base::withVisible(base::local({ [15:31:45.812] do.call(function(...) { [15:31:45.812] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.812] if (!identical(...future.globals.maxSize.org, [15:31:45.812] ...future.globals.maxSize)) { [15:31:45.812] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.812] on.exit(options(oopts), add = TRUE) [15:31:45.812] } [15:31:45.812] { [15:31:45.812] lapply(seq_along(...future.elements_ii), [15:31:45.812] FUN = function(jj) { [15:31:45.812] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.812] ...future.FUN(...future.X_jj, ...) [15:31:45.812] }) [15:31:45.812] } [15:31:45.812] }, args = future.call.arguments) [15:31:45.812] })) [15:31:45.812] future::FutureResult(value = ...future.value$value, [15:31:45.812] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:45.812] ...future.rng), globalenv = if (FALSE) [15:31:45.812] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:45.812] ...future.globalenv.names)) [15:31:45.812] else NULL, started = ...future.startTime, version = "1.8") [15:31:45.812] }, condition = base::local({ [15:31:45.812] c <- base::c [15:31:45.812] inherits <- base::inherits [15:31:45.812] invokeRestart <- base::invokeRestart [15:31:45.812] length <- base::length [15:31:45.812] list <- base::list [15:31:45.812] seq.int <- base::seq.int [15:31:45.812] signalCondition <- base::signalCondition [15:31:45.812] sys.calls <- base::sys.calls [15:31:45.812] `[[` <- base::`[[` [15:31:45.812] `+` <- base::`+` [15:31:45.812] `<<-` <- base::`<<-` [15:31:45.812] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:45.812] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:45.812] 3L)] [15:31:45.812] } [15:31:45.812] function(cond) { [15:31:45.812] is_error <- inherits(cond, "error") [15:31:45.812] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:45.812] NULL) [15:31:45.812] if (is_error) { [15:31:45.812] sessionInformation <- function() { [15:31:45.812] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:45.812] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:45.812] search = base::search(), system = base::Sys.info()) [15:31:45.812] } [15:31:45.812] ...future.conditions[[length(...future.conditions) + [15:31:45.812] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:45.812] cond$call), session = sessionInformation(), [15:31:45.812] timestamp = base::Sys.time(), signaled = 0L) [15:31:45.812] signalCondition(cond) [15:31:45.812] } [15:31:45.812] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:45.812] "immediateCondition"))) { [15:31:45.812] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:45.812] ...future.conditions[[length(...future.conditions) + [15:31:45.812] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:45.812] if (TRUE && !signal) { [15:31:45.812] muffleCondition <- function (cond, pattern = "^muffle") [15:31:45.812] { [15:31:45.812] inherits <- base::inherits [15:31:45.812] invokeRestart <- base::invokeRestart [15:31:45.812] is.null <- base::is.null [15:31:45.812] muffled <- FALSE [15:31:45.812] if (inherits(cond, "message")) { [15:31:45.812] muffled <- grepl(pattern, "muffleMessage") [15:31:45.812] if (muffled) [15:31:45.812] invokeRestart("muffleMessage") [15:31:45.812] } [15:31:45.812] else if (inherits(cond, "warning")) { [15:31:45.812] muffled <- grepl(pattern, "muffleWarning") [15:31:45.812] if (muffled) [15:31:45.812] invokeRestart("muffleWarning") [15:31:45.812] } [15:31:45.812] else if (inherits(cond, "condition")) { [15:31:45.812] if (!is.null(pattern)) { [15:31:45.812] computeRestarts <- base::computeRestarts [15:31:45.812] grepl <- base::grepl [15:31:45.812] restarts <- computeRestarts(cond) [15:31:45.812] for (restart in restarts) { [15:31:45.812] name <- restart$name [15:31:45.812] if (is.null(name)) [15:31:45.812] next [15:31:45.812] if (!grepl(pattern, name)) [15:31:45.812] next [15:31:45.812] invokeRestart(restart) [15:31:45.812] muffled <- TRUE [15:31:45.812] break [15:31:45.812] } [15:31:45.812] } [15:31:45.812] } [15:31:45.812] invisible(muffled) [15:31:45.812] } [15:31:45.812] muffleCondition(cond, pattern = "^muffle") [15:31:45.812] } [15:31:45.812] } [15:31:45.812] else { [15:31:45.812] if (TRUE) { [15:31:45.812] muffleCondition <- function (cond, pattern = "^muffle") [15:31:45.812] { [15:31:45.812] inherits <- base::inherits [15:31:45.812] invokeRestart <- base::invokeRestart [15:31:45.812] is.null <- base::is.null [15:31:45.812] muffled <- FALSE [15:31:45.812] if (inherits(cond, "message")) { [15:31:45.812] muffled <- grepl(pattern, "muffleMessage") [15:31:45.812] if (muffled) [15:31:45.812] invokeRestart("muffleMessage") [15:31:45.812] } [15:31:45.812] else if (inherits(cond, "warning")) { [15:31:45.812] muffled <- grepl(pattern, "muffleWarning") [15:31:45.812] if (muffled) [15:31:45.812] invokeRestart("muffleWarning") [15:31:45.812] } [15:31:45.812] else if (inherits(cond, "condition")) { [15:31:45.812] if (!is.null(pattern)) { [15:31:45.812] computeRestarts <- base::computeRestarts [15:31:45.812] grepl <- base::grepl [15:31:45.812] restarts <- computeRestarts(cond) [15:31:45.812] for (restart in restarts) { [15:31:45.812] name <- restart$name [15:31:45.812] if (is.null(name)) [15:31:45.812] next [15:31:45.812] if (!grepl(pattern, name)) [15:31:45.812] next [15:31:45.812] invokeRestart(restart) [15:31:45.812] muffled <- TRUE [15:31:45.812] break [15:31:45.812] } [15:31:45.812] } [15:31:45.812] } [15:31:45.812] invisible(muffled) [15:31:45.812] } [15:31:45.812] muffleCondition(cond, pattern = "^muffle") [15:31:45.812] } [15:31:45.812] } [15:31:45.812] } [15:31:45.812] })) [15:31:45.812] }, error = function(ex) { [15:31:45.812] base::structure(base::list(value = NULL, visible = NULL, [15:31:45.812] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:45.812] ...future.rng), started = ...future.startTime, [15:31:45.812] finished = Sys.time(), session_uuid = NA_character_, [15:31:45.812] version = "1.8"), class = "FutureResult") [15:31:45.812] }, finally = { [15:31:45.812] if (!identical(...future.workdir, getwd())) [15:31:45.812] setwd(...future.workdir) [15:31:45.812] { [15:31:45.812] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:45.812] ...future.oldOptions$nwarnings <- NULL [15:31:45.812] } [15:31:45.812] base::options(...future.oldOptions) [15:31:45.812] if (.Platform$OS.type == "windows") { [15:31:45.812] old_names <- names(...future.oldEnvVars) [15:31:45.812] envs <- base::Sys.getenv() [15:31:45.812] names <- names(envs) [15:31:45.812] common <- intersect(names, old_names) [15:31:45.812] added <- setdiff(names, old_names) [15:31:45.812] removed <- setdiff(old_names, names) [15:31:45.812] changed <- common[...future.oldEnvVars[common] != [15:31:45.812] envs[common]] [15:31:45.812] NAMES <- toupper(changed) [15:31:45.812] args <- list() [15:31:45.812] for (kk in seq_along(NAMES)) { [15:31:45.812] name <- changed[[kk]] [15:31:45.812] NAME <- NAMES[[kk]] [15:31:45.812] if (name != NAME && is.element(NAME, old_names)) [15:31:45.812] next [15:31:45.812] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:45.812] } [15:31:45.812] NAMES <- toupper(added) [15:31:45.812] for (kk in seq_along(NAMES)) { [15:31:45.812] name <- added[[kk]] [15:31:45.812] NAME <- NAMES[[kk]] [15:31:45.812] if (name != NAME && is.element(NAME, old_names)) [15:31:45.812] next [15:31:45.812] args[[name]] <- "" [15:31:45.812] } [15:31:45.812] NAMES <- toupper(removed) [15:31:45.812] for (kk in seq_along(NAMES)) { [15:31:45.812] name <- removed[[kk]] [15:31:45.812] NAME <- NAMES[[kk]] [15:31:45.812] if (name != NAME && is.element(NAME, old_names)) [15:31:45.812] next [15:31:45.812] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:45.812] } [15:31:45.812] if (length(args) > 0) [15:31:45.812] base::do.call(base::Sys.setenv, args = args) [15:31:45.812] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:45.812] } [15:31:45.812] else { [15:31:45.812] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:45.812] } [15:31:45.812] { [15:31:45.812] if (base::length(...future.futureOptionsAdded) > [15:31:45.812] 0L) { [15:31:45.812] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:45.812] base::names(opts) <- ...future.futureOptionsAdded [15:31:45.812] base::options(opts) [15:31:45.812] } [15:31:45.812] { [15:31:45.812] { [15:31:45.812] NULL [15:31:45.812] RNGkind("Mersenne-Twister") [15:31:45.812] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:45.812] inherits = FALSE) [15:31:45.812] } [15:31:45.812] options(future.plan = NULL) [15:31:45.812] if (is.na(NA_character_)) [15:31:45.812] Sys.unsetenv("R_FUTURE_PLAN") [15:31:45.812] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:45.812] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:45.812] .init = FALSE) [15:31:45.812] } [15:31:45.812] } [15:31:45.812] } [15:31:45.812] }) [15:31:45.812] if (TRUE) { [15:31:45.812] base::sink(type = "output", split = FALSE) [15:31:45.812] if (TRUE) { [15:31:45.812] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:45.812] } [15:31:45.812] else { [15:31:45.812] ...future.result["stdout"] <- base::list(NULL) [15:31:45.812] } [15:31:45.812] base::close(...future.stdout) [15:31:45.812] ...future.stdout <- NULL [15:31:45.812] } [15:31:45.812] ...future.result$conditions <- ...future.conditions [15:31:45.812] ...future.result$finished <- base::Sys.time() [15:31:45.812] ...future.result [15:31:45.812] } [15:31:45.819] assign_globals() ... [15:31:45.819] List of 5 [15:31:45.819] $ ...future.FUN :function (x, ...) [15:31:45.819] $ future.call.arguments : list() [15:31:45.819] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:45.819] $ ...future.elements_ii :List of 1 [15:31:45.819] ..$ b:Classes 'listenv', 'environment' [15:31:45.819] $ ...future.seeds_ii : NULL [15:31:45.819] $ ...future.globals.maxSize: NULL [15:31:45.819] - attr(*, "where")=List of 5 [15:31:45.819] ..$ ...future.FUN : [15:31:45.819] ..$ future.call.arguments : [15:31:45.819] ..$ ...future.elements_ii : [15:31:45.819] ..$ ...future.seeds_ii : [15:31:45.819] ..$ ...future.globals.maxSize: [15:31:45.819] - attr(*, "resolved")= logi FALSE [15:31:45.819] - attr(*, "total_size")= num 4968 [15:31:45.819] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:45.819] - attr(*, "already-done")= logi TRUE [15:31:45.829] - copied '...future.FUN' to environment [15:31:45.829] - copied 'future.call.arguments' to environment [15:31:45.829] - copied '...future.elements_ii' to environment [15:31:45.829] - copied '...future.seeds_ii' to environment [15:31:45.830] - copied '...future.globals.maxSize' to environment [15:31:45.830] assign_globals() ... done [15:31:45.831] plan(): Setting new future strategy stack: [15:31:45.831] List of future strategies: [15:31:45.831] 1. sequential: [15:31:45.831] - args: function (..., envir = parent.frame(), workers = "") [15:31:45.831] - tweaked: FALSE [15:31:45.831] - call: NULL [15:31:45.832] plan(): nbrOfWorkers() = 1 [15:31:45.834] plan(): Setting new future strategy stack: [15:31:45.835] List of future strategies: [15:31:45.835] 1. sequential: [15:31:45.835] - args: function (..., envir = parent.frame(), workers = "") [15:31:45.835] - tweaked: FALSE [15:31:45.835] - call: plan(strategy) [15:31:45.836] plan(): nbrOfWorkers() = 1 [15:31:45.836] SequentialFuture started (and completed) [15:31:45.836] - Launch lazy future ... done [15:31:45.837] run() for 'SequentialFuture' ... done [15:31:45.837] Created future: [15:31:45.837] SequentialFuture: [15:31:45.837] Label: 'future_lapply-2' [15:31:45.837] Expression: [15:31:45.837] { [15:31:45.837] do.call(function(...) { [15:31:45.837] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.837] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:45.837] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.837] on.exit(options(oopts), add = TRUE) [15:31:45.837] } [15:31:45.837] { [15:31:45.837] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:45.837] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.837] ...future.FUN(...future.X_jj, ...) [15:31:45.837] }) [15:31:45.837] } [15:31:45.837] }, args = future.call.arguments) [15:31:45.837] } [15:31:45.837] Lazy evaluation: FALSE [15:31:45.837] Asynchronous evaluation: FALSE [15:31:45.837] Local evaluation: TRUE [15:31:45.837] Environment: R_GlobalEnv [15:31:45.837] Capture standard output: TRUE [15:31:45.837] Capture condition classes: 'condition' (excluding 'nothing') [15:31:45.837] Globals: 5 objects totaling 17.79 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 12.94 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:45.837] Packages: 1 packages ('listenv') [15:31:45.837] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:45.837] Resolved: TRUE [15:31:45.837] Value: 464 bytes of class 'list' [15:31:45.837] Early signaling: FALSE [15:31:45.837] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:45.837] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:45.843] Chunk #2 of 2 ... DONE [15:31:45.843] Launching 2 futures (chunks) ... DONE [15:31:45.843] Resolving 2 futures (chunks) ... [15:31:45.844] resolve() on list ... [15:31:45.844] recursive: 0 [15:31:45.844] length: 2 [15:31:45.844] [15:31:45.845] resolved() for 'SequentialFuture' ... [15:31:45.845] - state: 'finished' [15:31:45.845] - run: TRUE [15:31:45.846] - result: 'FutureResult' [15:31:45.846] resolved() for 'SequentialFuture' ... done [15:31:45.846] Future #1 [15:31:45.847] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:45.847] - nx: 2 [15:31:45.847] - relay: TRUE [15:31:45.848] - stdout: TRUE [15:31:45.848] - signal: TRUE [15:31:45.848] - resignal: FALSE [15:31:45.848] - force: TRUE [15:31:45.849] - relayed: [n=2] FALSE, FALSE [15:31:45.849] - queued futures: [n=2] FALSE, FALSE [15:31:45.849] - until=1 [15:31:45.849] - relaying element #1 [15:31:45.850] - relayed: [n=2] TRUE, FALSE [15:31:45.850] - queued futures: [n=2] TRUE, FALSE [15:31:45.851] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:45.851] length: 1 (resolved future 1) [15:31:45.851] resolved() for 'SequentialFuture' ... [15:31:45.852] - state: 'finished' [15:31:45.852] - run: TRUE [15:31:45.852] - result: 'FutureResult' [15:31:45.853] resolved() for 'SequentialFuture' ... done [15:31:45.853] Future #2 [15:31:45.853] signalConditionsASAP(SequentialFuture, pos=2) ... [15:31:45.854] - nx: 2 [15:31:45.854] - relay: TRUE [15:31:45.854] - stdout: TRUE [15:31:45.854] - signal: TRUE [15:31:45.855] - resignal: FALSE [15:31:45.855] - force: TRUE [15:31:45.855] - relayed: [n=2] TRUE, FALSE [15:31:45.855] - queued futures: [n=2] TRUE, FALSE [15:31:45.856] - until=2 [15:31:45.856] - relaying element #2 [15:31:45.856] - relayed: [n=2] TRUE, TRUE [15:31:45.857] - queued futures: [n=2] TRUE, TRUE [15:31:45.857] signalConditionsASAP(SequentialFuture, pos=2) ... done [15:31:45.857] length: 0 (resolved future 2) [15:31:45.857] Relaying remaining futures [15:31:45.858] signalConditionsASAP(NULL, pos=0) ... [15:31:45.858] - nx: 2 [15:31:45.858] - relay: TRUE [15:31:45.858] - stdout: TRUE [15:31:45.859] - signal: TRUE [15:31:45.859] - resignal: FALSE [15:31:45.859] - force: TRUE [15:31:45.859] - relayed: [n=2] TRUE, TRUE [15:31:45.859] - queued futures: [n=2] TRUE, TRUE - flush all [15:31:45.860] - relayed: [n=2] TRUE, TRUE [15:31:45.860] - queued futures: [n=2] TRUE, TRUE [15:31:45.860] signalConditionsASAP(NULL, pos=0) ... done [15:31:45.861] resolve() on list ... DONE [15:31:45.861] - Number of value chunks collected: 2 [15:31:45.861] Resolving 2 futures (chunks) ... DONE [15:31:45.862] Reducing values from 2 chunks ... [15:31:45.862] - Number of values collected after concatenation: 2 [15:31:45.862] - Number of values expected: 2 [15:31:45.862] Reducing values from 2 chunks ... DONE [15:31:45.863] 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, ...) ... [15:31:45.867] future_lapply() ... [15:31:45.868] Number of chunks: 1 [15:31:45.868] getGlobalsAndPackagesXApply() ... [15:31:45.869] - future.globals: TRUE [15:31:45.869] getGlobalsAndPackages() ... [15:31:45.869] Searching for globals... [15:31:45.872] - globals found: [2] 'FUN', '.Internal' [15:31:45.872] Searching for globals ... DONE [15:31:45.872] Resolving globals: FALSE [15:31:45.873] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:45.874] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:45.874] - globals: [1] 'FUN' [15:31:45.875] [15:31:45.875] getGlobalsAndPackages() ... DONE [15:31:45.875] - globals found/used: [n=1] 'FUN' [15:31:45.876] - needed namespaces: [n=0] [15:31:45.876] Finding globals ... DONE [15:31:45.876] - use_args: TRUE [15:31:45.877] - Getting '...' globals ... [15:31:45.877] resolve() on list ... [15:31:45.878] recursive: 0 [15:31:45.878] length: 1 [15:31:45.878] elements: '...' [15:31:45.879] length: 0 (resolved future 1) [15:31:45.879] resolve() on list ... DONE [15:31:45.879] - '...' content: [n=1] 'length' [15:31:45.880] List of 1 [15:31:45.880] $ ...:List of 1 [15:31:45.880] ..$ length: int 2 [15:31:45.880] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:45.880] - attr(*, "where")=List of 1 [15:31:45.880] ..$ ...: [15:31:45.880] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:45.880] - attr(*, "resolved")= logi TRUE [15:31:45.880] - attr(*, "total_size")= num NA [15:31:45.886] - Getting '...' globals ... DONE [15:31:45.889] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:45.889] List of 2 [15:31:45.889] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:45.889] $ ... :List of 1 [15:31:45.889] ..$ length: int 2 [15:31:45.889] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:45.889] - attr(*, "where")=List of 2 [15:31:45.889] ..$ ...future.FUN: [15:31:45.889] ..$ ... : [15:31:45.889] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:45.889] - attr(*, "resolved")= logi FALSE [15:31:45.889] - attr(*, "total_size")= num 2240 [15:31:45.897] Packages to be attached in all futures: [n=0] [15:31:45.897] getGlobalsAndPackagesXApply() ... DONE [15:31:45.898] Number of futures (= number of chunks): 1 [15:31:45.898] Launching 1 futures (chunks) ... [15:31:45.898] Chunk #1 of 1 ... [15:31:45.899] - Finding globals in 'X' for chunk #1 ... [15:31:45.899] getGlobalsAndPackages() ... [15:31:45.899] Searching for globals... [15:31:45.900] [15:31:45.900] Searching for globals ... DONE [15:31:45.900] - globals: [0] [15:31:45.901] getGlobalsAndPackages() ... DONE [15:31:45.901] + additional globals found: [n=0] [15:31:45.901] + additional namespaces needed: [n=0] [15:31:45.902] - Finding globals in 'X' for chunk #1 ... DONE [15:31:45.902] - seeds: [15:31:45.902] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.903] getGlobalsAndPackages() ... [15:31:45.903] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.903] Resolving globals: FALSE [15:31:45.904] Tweak future expression to call with '...' arguments ... [15:31:45.904] { [15:31:45.904] do.call(function(...) { [15:31:45.904] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.904] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:45.904] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.904] on.exit(options(oopts), add = TRUE) [15:31:45.904] } [15:31:45.904] { [15:31:45.904] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:45.904] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.904] ...future.FUN(...future.X_jj, ...) [15:31:45.904] }) [15:31:45.904] } [15:31:45.904] }, args = future.call.arguments) [15:31:45.904] } [15:31:45.905] Tweak future expression to call with '...' arguments ... DONE [15:31:45.906] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.906] [15:31:45.906] getGlobalsAndPackages() ... DONE [15:31:45.907] run() for 'Future' ... [15:31:45.908] - state: 'created' [15:31:45.908] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:45.908] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:45.909] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:45.909] - Field: 'label' [15:31:45.909] - Field: 'local' [15:31:45.910] - Field: 'owner' [15:31:45.910] - Field: 'envir' [15:31:45.910] - Field: 'packages' [15:31:45.910] - Field: 'gc' [15:31:45.911] - Field: 'conditions' [15:31:45.911] - Field: 'expr' [15:31:45.911] - Field: 'uuid' [15:31:45.911] - Field: 'seed' [15:31:45.912] - Field: 'version' [15:31:45.912] - Field: 'result' [15:31:45.912] - Field: 'asynchronous' [15:31:45.912] - Field: 'calls' [15:31:45.913] - Field: 'globals' [15:31:45.913] - Field: 'stdout' [15:31:45.913] - Field: 'earlySignal' [15:31:45.914] - Field: 'lazy' [15:31:45.914] - Field: 'state' [15:31:45.914] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:45.914] - Launch lazy future ... [15:31:45.915] Packages needed by the future expression (n = 0): [15:31:45.915] Packages needed by future strategies (n = 0): [15:31:45.916] { [15:31:45.916] { [15:31:45.916] { [15:31:45.916] ...future.startTime <- base::Sys.time() [15:31:45.916] { [15:31:45.916] { [15:31:45.916] { [15:31:45.916] base::local({ [15:31:45.916] has_future <- base::requireNamespace("future", [15:31:45.916] quietly = TRUE) [15:31:45.916] if (has_future) { [15:31:45.916] ns <- base::getNamespace("future") [15:31:45.916] version <- ns[[".package"]][["version"]] [15:31:45.916] if (is.null(version)) [15:31:45.916] version <- utils::packageVersion("future") [15:31:45.916] } [15:31:45.916] else { [15:31:45.916] version <- NULL [15:31:45.916] } [15:31:45.916] if (!has_future || version < "1.8.0") { [15:31:45.916] info <- base::c(r_version = base::gsub("R version ", [15:31:45.916] "", base::R.version$version.string), [15:31:45.916] platform = base::sprintf("%s (%s-bit)", [15:31:45.916] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:45.916] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:45.916] "release", "version")], collapse = " "), [15:31:45.916] hostname = base::Sys.info()[["nodename"]]) [15:31:45.916] info <- base::sprintf("%s: %s", base::names(info), [15:31:45.916] info) [15:31:45.916] info <- base::paste(info, collapse = "; ") [15:31:45.916] if (!has_future) { [15:31:45.916] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:45.916] info) [15:31:45.916] } [15:31:45.916] else { [15:31:45.916] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:45.916] info, version) [15:31:45.916] } [15:31:45.916] base::stop(msg) [15:31:45.916] } [15:31:45.916] }) [15:31:45.916] } [15:31:45.916] ...future.strategy.old <- future::plan("list") [15:31:45.916] options(future.plan = NULL) [15:31:45.916] Sys.unsetenv("R_FUTURE_PLAN") [15:31:45.916] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:45.916] } [15:31:45.916] ...future.workdir <- getwd() [15:31:45.916] } [15:31:45.916] ...future.oldOptions <- base::as.list(base::.Options) [15:31:45.916] ...future.oldEnvVars <- base::Sys.getenv() [15:31:45.916] } [15:31:45.916] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:45.916] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:45.916] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:45.916] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:45.916] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:45.916] future.stdout.windows.reencode = NULL, width = 80L) [15:31:45.916] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:45.916] base::names(...future.oldOptions)) [15:31:45.916] } [15:31:45.916] if (FALSE) { [15:31:45.916] } [15:31:45.916] else { [15:31:45.916] if (TRUE) { [15:31:45.916] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:45.916] open = "w") [15:31:45.916] } [15:31:45.916] else { [15:31:45.916] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:45.916] windows = "NUL", "/dev/null"), open = "w") [15:31:45.916] } [15:31:45.916] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:45.916] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:45.916] base::sink(type = "output", split = FALSE) [15:31:45.916] base::close(...future.stdout) [15:31:45.916] }, add = TRUE) [15:31:45.916] } [15:31:45.916] ...future.frame <- base::sys.nframe() [15:31:45.916] ...future.conditions <- base::list() [15:31:45.916] ...future.rng <- base::globalenv()$.Random.seed [15:31:45.916] if (FALSE) { [15:31:45.916] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:45.916] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:45.916] } [15:31:45.916] ...future.result <- base::tryCatch({ [15:31:45.916] base::withCallingHandlers({ [15:31:45.916] ...future.value <- base::withVisible(base::local({ [15:31:45.916] do.call(function(...) { [15:31:45.916] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.916] if (!identical(...future.globals.maxSize.org, [15:31:45.916] ...future.globals.maxSize)) { [15:31:45.916] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.916] on.exit(options(oopts), add = TRUE) [15:31:45.916] } [15:31:45.916] { [15:31:45.916] lapply(seq_along(...future.elements_ii), [15:31:45.916] FUN = function(jj) { [15:31:45.916] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.916] ...future.FUN(...future.X_jj, ...) [15:31:45.916] }) [15:31:45.916] } [15:31:45.916] }, args = future.call.arguments) [15:31:45.916] })) [15:31:45.916] future::FutureResult(value = ...future.value$value, [15:31:45.916] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:45.916] ...future.rng), globalenv = if (FALSE) [15:31:45.916] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:45.916] ...future.globalenv.names)) [15:31:45.916] else NULL, started = ...future.startTime, version = "1.8") [15:31:45.916] }, condition = base::local({ [15:31:45.916] c <- base::c [15:31:45.916] inherits <- base::inherits [15:31:45.916] invokeRestart <- base::invokeRestart [15:31:45.916] length <- base::length [15:31:45.916] list <- base::list [15:31:45.916] seq.int <- base::seq.int [15:31:45.916] signalCondition <- base::signalCondition [15:31:45.916] sys.calls <- base::sys.calls [15:31:45.916] `[[` <- base::`[[` [15:31:45.916] `+` <- base::`+` [15:31:45.916] `<<-` <- base::`<<-` [15:31:45.916] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:45.916] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:45.916] 3L)] [15:31:45.916] } [15:31:45.916] function(cond) { [15:31:45.916] is_error <- inherits(cond, "error") [15:31:45.916] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:45.916] NULL) [15:31:45.916] if (is_error) { [15:31:45.916] sessionInformation <- function() { [15:31:45.916] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:45.916] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:45.916] search = base::search(), system = base::Sys.info()) [15:31:45.916] } [15:31:45.916] ...future.conditions[[length(...future.conditions) + [15:31:45.916] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:45.916] cond$call), session = sessionInformation(), [15:31:45.916] timestamp = base::Sys.time(), signaled = 0L) [15:31:45.916] signalCondition(cond) [15:31:45.916] } [15:31:45.916] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:45.916] "immediateCondition"))) { [15:31:45.916] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:45.916] ...future.conditions[[length(...future.conditions) + [15:31:45.916] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:45.916] if (TRUE && !signal) { [15:31:45.916] muffleCondition <- function (cond, pattern = "^muffle") [15:31:45.916] { [15:31:45.916] inherits <- base::inherits [15:31:45.916] invokeRestart <- base::invokeRestart [15:31:45.916] is.null <- base::is.null [15:31:45.916] muffled <- FALSE [15:31:45.916] if (inherits(cond, "message")) { [15:31:45.916] muffled <- grepl(pattern, "muffleMessage") [15:31:45.916] if (muffled) [15:31:45.916] invokeRestart("muffleMessage") [15:31:45.916] } [15:31:45.916] else if (inherits(cond, "warning")) { [15:31:45.916] muffled <- grepl(pattern, "muffleWarning") [15:31:45.916] if (muffled) [15:31:45.916] invokeRestart("muffleWarning") [15:31:45.916] } [15:31:45.916] else if (inherits(cond, "condition")) { [15:31:45.916] if (!is.null(pattern)) { [15:31:45.916] computeRestarts <- base::computeRestarts [15:31:45.916] grepl <- base::grepl [15:31:45.916] restarts <- computeRestarts(cond) [15:31:45.916] for (restart in restarts) { [15:31:45.916] name <- restart$name [15:31:45.916] if (is.null(name)) [15:31:45.916] next [15:31:45.916] if (!grepl(pattern, name)) [15:31:45.916] next [15:31:45.916] invokeRestart(restart) [15:31:45.916] muffled <- TRUE [15:31:45.916] break [15:31:45.916] } [15:31:45.916] } [15:31:45.916] } [15:31:45.916] invisible(muffled) [15:31:45.916] } [15:31:45.916] muffleCondition(cond, pattern = "^muffle") [15:31:45.916] } [15:31:45.916] } [15:31:45.916] else { [15:31:45.916] if (TRUE) { [15:31:45.916] muffleCondition <- function (cond, pattern = "^muffle") [15:31:45.916] { [15:31:45.916] inherits <- base::inherits [15:31:45.916] invokeRestart <- base::invokeRestart [15:31:45.916] is.null <- base::is.null [15:31:45.916] muffled <- FALSE [15:31:45.916] if (inherits(cond, "message")) { [15:31:45.916] muffled <- grepl(pattern, "muffleMessage") [15:31:45.916] if (muffled) [15:31:45.916] invokeRestart("muffleMessage") [15:31:45.916] } [15:31:45.916] else if (inherits(cond, "warning")) { [15:31:45.916] muffled <- grepl(pattern, "muffleWarning") [15:31:45.916] if (muffled) [15:31:45.916] invokeRestart("muffleWarning") [15:31:45.916] } [15:31:45.916] else if (inherits(cond, "condition")) { [15:31:45.916] if (!is.null(pattern)) { [15:31:45.916] computeRestarts <- base::computeRestarts [15:31:45.916] grepl <- base::grepl [15:31:45.916] restarts <- computeRestarts(cond) [15:31:45.916] for (restart in restarts) { [15:31:45.916] name <- restart$name [15:31:45.916] if (is.null(name)) [15:31:45.916] next [15:31:45.916] if (!grepl(pattern, name)) [15:31:45.916] next [15:31:45.916] invokeRestart(restart) [15:31:45.916] muffled <- TRUE [15:31:45.916] break [15:31:45.916] } [15:31:45.916] } [15:31:45.916] } [15:31:45.916] invisible(muffled) [15:31:45.916] } [15:31:45.916] muffleCondition(cond, pattern = "^muffle") [15:31:45.916] } [15:31:45.916] } [15:31:45.916] } [15:31:45.916] })) [15:31:45.916] }, error = function(ex) { [15:31:45.916] base::structure(base::list(value = NULL, visible = NULL, [15:31:45.916] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:45.916] ...future.rng), started = ...future.startTime, [15:31:45.916] finished = Sys.time(), session_uuid = NA_character_, [15:31:45.916] version = "1.8"), class = "FutureResult") [15:31:45.916] }, finally = { [15:31:45.916] if (!identical(...future.workdir, getwd())) [15:31:45.916] setwd(...future.workdir) [15:31:45.916] { [15:31:45.916] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:45.916] ...future.oldOptions$nwarnings <- NULL [15:31:45.916] } [15:31:45.916] base::options(...future.oldOptions) [15:31:45.916] if (.Platform$OS.type == "windows") { [15:31:45.916] old_names <- names(...future.oldEnvVars) [15:31:45.916] envs <- base::Sys.getenv() [15:31:45.916] names <- names(envs) [15:31:45.916] common <- intersect(names, old_names) [15:31:45.916] added <- setdiff(names, old_names) [15:31:45.916] removed <- setdiff(old_names, names) [15:31:45.916] changed <- common[...future.oldEnvVars[common] != [15:31:45.916] envs[common]] [15:31:45.916] NAMES <- toupper(changed) [15:31:45.916] args <- list() [15:31:45.916] for (kk in seq_along(NAMES)) { [15:31:45.916] name <- changed[[kk]] [15:31:45.916] NAME <- NAMES[[kk]] [15:31:45.916] if (name != NAME && is.element(NAME, old_names)) [15:31:45.916] next [15:31:45.916] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:45.916] } [15:31:45.916] NAMES <- toupper(added) [15:31:45.916] for (kk in seq_along(NAMES)) { [15:31:45.916] name <- added[[kk]] [15:31:45.916] NAME <- NAMES[[kk]] [15:31:45.916] if (name != NAME && is.element(NAME, old_names)) [15:31:45.916] next [15:31:45.916] args[[name]] <- "" [15:31:45.916] } [15:31:45.916] NAMES <- toupper(removed) [15:31:45.916] for (kk in seq_along(NAMES)) { [15:31:45.916] name <- removed[[kk]] [15:31:45.916] NAME <- NAMES[[kk]] [15:31:45.916] if (name != NAME && is.element(NAME, old_names)) [15:31:45.916] next [15:31:45.916] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:45.916] } [15:31:45.916] if (length(args) > 0) [15:31:45.916] base::do.call(base::Sys.setenv, args = args) [15:31:45.916] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:45.916] } [15:31:45.916] else { [15:31:45.916] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:45.916] } [15:31:45.916] { [15:31:45.916] if (base::length(...future.futureOptionsAdded) > [15:31:45.916] 0L) { [15:31:45.916] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:45.916] base::names(opts) <- ...future.futureOptionsAdded [15:31:45.916] base::options(opts) [15:31:45.916] } [15:31:45.916] { [15:31:45.916] { [15:31:45.916] NULL [15:31:45.916] RNGkind("Mersenne-Twister") [15:31:45.916] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:45.916] inherits = FALSE) [15:31:45.916] } [15:31:45.916] options(future.plan = NULL) [15:31:45.916] if (is.na(NA_character_)) [15:31:45.916] Sys.unsetenv("R_FUTURE_PLAN") [15:31:45.916] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:45.916] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:45.916] .init = FALSE) [15:31:45.916] } [15:31:45.916] } [15:31:45.916] } [15:31:45.916] }) [15:31:45.916] if (TRUE) { [15:31:45.916] base::sink(type = "output", split = FALSE) [15:31:45.916] if (TRUE) { [15:31:45.916] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:45.916] } [15:31:45.916] else { [15:31:45.916] ...future.result["stdout"] <- base::list(NULL) [15:31:45.916] } [15:31:45.916] base::close(...future.stdout) [15:31:45.916] ...future.stdout <- NULL [15:31:45.916] } [15:31:45.916] ...future.result$conditions <- ...future.conditions [15:31:45.916] ...future.result$finished <- base::Sys.time() [15:31:45.916] ...future.result [15:31:45.916] } [15:31:45.923] assign_globals() ... [15:31:45.923] List of 5 [15:31:45.923] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:45.923] $ future.call.arguments :List of 1 [15:31:45.923] ..$ length: int 2 [15:31:45.923] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:45.923] $ ...future.elements_ii :List of 4 [15:31:45.923] ..$ a: chr "integer" [15:31:45.923] ..$ b: chr "numeric" [15:31:45.923] ..$ c: chr "character" [15:31:45.923] ..$ c: chr "list" [15:31:45.923] $ ...future.seeds_ii : NULL [15:31:45.923] $ ...future.globals.maxSize: NULL [15:31:45.923] - attr(*, "where")=List of 5 [15:31:45.923] ..$ ...future.FUN : [15:31:45.923] ..$ future.call.arguments : [15:31:45.923] ..$ ...future.elements_ii : [15:31:45.923] ..$ ...future.seeds_ii : [15:31:45.923] ..$ ...future.globals.maxSize: [15:31:45.923] - attr(*, "resolved")= logi FALSE [15:31:45.923] - attr(*, "total_size")= num 2240 [15:31:45.923] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:45.923] - attr(*, "already-done")= logi TRUE [15:31:45.933] - copied '...future.FUN' to environment [15:31:45.934] - copied 'future.call.arguments' to environment [15:31:45.934] - copied '...future.elements_ii' to environment [15:31:45.934] - copied '...future.seeds_ii' to environment [15:31:45.937] - copied '...future.globals.maxSize' to environment [15:31:45.938] assign_globals() ... done [15:31:45.938] plan(): Setting new future strategy stack: [15:31:45.939] List of future strategies: [15:31:45.939] 1. sequential: [15:31:45.939] - args: function (..., envir = parent.frame(), workers = "") [15:31:45.939] - tweaked: FALSE [15:31:45.939] - call: NULL [15:31:45.940] plan(): nbrOfWorkers() = 1 [15:31:45.942] plan(): Setting new future strategy stack: [15:31:45.942] List of future strategies: [15:31:45.942] 1. sequential: [15:31:45.942] - args: function (..., envir = parent.frame(), workers = "") [15:31:45.942] - tweaked: FALSE [15:31:45.942] - call: plan(strategy) [15:31:45.943] plan(): nbrOfWorkers() = 1 [15:31:45.943] SequentialFuture started (and completed) [15:31:45.944] - Launch lazy future ... done [15:31:45.944] run() for 'SequentialFuture' ... done [15:31:45.944] Created future: [15:31:45.945] SequentialFuture: [15:31:45.945] Label: 'future_lapply-1' [15:31:45.945] Expression: [15:31:45.945] { [15:31:45.945] do.call(function(...) { [15:31:45.945] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.945] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:45.945] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.945] on.exit(options(oopts), add = TRUE) [15:31:45.945] } [15:31:45.945] { [15:31:45.945] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:45.945] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.945] ...future.FUN(...future.X_jj, ...) [15:31:45.945] }) [15:31:45.945] } [15:31:45.945] }, args = future.call.arguments) [15:31:45.945] } [15:31:45.945] Lazy evaluation: FALSE [15:31:45.945] Asynchronous evaluation: FALSE [15:31:45.945] Local evaluation: TRUE [15:31:45.945] Environment: R_GlobalEnv [15:31:45.945] Capture standard output: TRUE [15:31:45.945] Capture condition classes: 'condition' (excluding 'nothing') [15:31:45.945] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:45.945] Packages: [15:31:45.945] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:45.945] Resolved: TRUE [15:31:45.945] Value: 240 bytes of class 'list' [15:31:45.945] Early signaling: FALSE [15:31:45.945] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:45.945] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:45.947] Chunk #1 of 1 ... DONE [15:31:45.947] Launching 1 futures (chunks) ... DONE [15:31:45.947] Resolving 1 futures (chunks) ... [15:31:45.947] resolve() on list ... [15:31:45.948] recursive: 0 [15:31:45.948] length: 1 [15:31:45.948] [15:31:45.948] resolved() for 'SequentialFuture' ... [15:31:45.949] - state: 'finished' [15:31:45.949] - run: TRUE [15:31:45.949] - result: 'FutureResult' [15:31:45.949] resolved() for 'SequentialFuture' ... done [15:31:45.950] Future #1 [15:31:45.950] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:45.950] - nx: 1 [15:31:45.951] - relay: TRUE [15:31:45.951] - stdout: TRUE [15:31:45.951] - signal: TRUE [15:31:45.951] - resignal: FALSE [15:31:45.951] - force: TRUE [15:31:45.952] - relayed: [n=1] FALSE [15:31:45.952] - queued futures: [n=1] FALSE [15:31:45.952] - until=1 [15:31:45.952] - relaying element #1 [15:31:45.953] - relayed: [n=1] TRUE [15:31:45.953] - queued futures: [n=1] TRUE [15:31:45.953] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:45.954] length: 0 (resolved future 1) [15:31:45.954] Relaying remaining futures [15:31:45.954] signalConditionsASAP(NULL, pos=0) ... [15:31:45.954] - nx: 1 [15:31:45.955] - relay: TRUE [15:31:45.955] - stdout: TRUE [15:31:45.955] - signal: TRUE [15:31:45.955] - resignal: FALSE [15:31:45.956] - force: TRUE [15:31:45.956] - relayed: [n=1] TRUE [15:31:45.956] - queued futures: [n=1] TRUE - flush all [15:31:45.956] - relayed: [n=1] TRUE [15:31:45.957] - queued futures: [n=1] TRUE [15:31:45.957] signalConditionsASAP(NULL, pos=0) ... done [15:31:45.957] resolve() on list ... DONE [15:31:45.958] - Number of value chunks collected: 1 [15:31:45.958] Resolving 1 futures (chunks) ... DONE [15:31:45.958] Reducing values from 1 chunks ... [15:31:45.959] - Number of values collected after concatenation: 4 [15:31:45.959] - Number of values expected: 4 [15:31:45.959] Reducing values from 1 chunks ... DONE [15:31:45.959] 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 [15:31:45.964] future_lapply() ... [15:31:45.965] Number of chunks: 1 [15:31:45.965] getGlobalsAndPackagesXApply() ... [15:31:45.966] - future.globals: TRUE [15:31:45.966] getGlobalsAndPackages() ... [15:31:45.966] Searching for globals... [15:31:45.968] - globals found: [2] 'FUN', '.Internal' [15:31:45.969] Searching for globals ... DONE [15:31:45.969] Resolving globals: FALSE [15:31:45.970] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:45.971] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:45.971] - globals: [1] 'FUN' [15:31:45.971] [15:31:45.972] getGlobalsAndPackages() ... DONE [15:31:45.972] - globals found/used: [n=1] 'FUN' [15:31:45.972] - needed namespaces: [n=0] [15:31:45.972] Finding globals ... DONE [15:31:45.973] - use_args: TRUE [15:31:45.973] - Getting '...' globals ... [15:31:45.974] resolve() on list ... [15:31:45.974] recursive: 0 [15:31:45.974] length: 1 [15:31:45.974] elements: '...' [15:31:45.975] length: 0 (resolved future 1) [15:31:45.975] resolve() on list ... DONE [15:31:45.975] - '...' content: [n=1] 'length' [15:31:45.976] List of 1 [15:31:45.976] $ ...:List of 1 [15:31:45.976] ..$ length: int 2 [15:31:45.976] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:45.976] - attr(*, "where")=List of 1 [15:31:45.976] ..$ ...: [15:31:45.976] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:45.976] - attr(*, "resolved")= logi TRUE [15:31:45.976] - attr(*, "total_size")= num NA [15:31:45.985] - Getting '...' globals ... DONE [15:31:45.986] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:45.986] List of 2 [15:31:45.986] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:45.986] $ ... :List of 1 [15:31:45.986] ..$ length: int 2 [15:31:45.986] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:45.986] - attr(*, "where")=List of 2 [15:31:45.986] ..$ ...future.FUN: [15:31:45.986] ..$ ... : [15:31:45.986] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:45.986] - attr(*, "resolved")= logi FALSE [15:31:45.986] - attr(*, "total_size")= num 2240 [15:31:45.992] Packages to be attached in all futures: [n=0] [15:31:45.992] getGlobalsAndPackagesXApply() ... DONE [15:31:45.993] Number of futures (= number of chunks): 1 [15:31:45.993] Launching 1 futures (chunks) ... [15:31:45.993] Chunk #1 of 1 ... [15:31:45.994] - Finding globals in 'X' for chunk #1 ... [15:31:45.994] getGlobalsAndPackages() ... [15:31:45.994] Searching for globals... [15:31:45.995] [15:31:45.995] Searching for globals ... DONE [15:31:45.995] - globals: [0] [15:31:45.996] getGlobalsAndPackages() ... DONE [15:31:45.996] + additional globals found: [n=0] [15:31:45.996] + additional namespaces needed: [n=0] [15:31:45.996] - Finding globals in 'X' for chunk #1 ... DONE [15:31:45.997] - seeds: [15:31:45.997] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.997] getGlobalsAndPackages() ... [15:31:45.997] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:45.998] Resolving globals: FALSE [15:31:45.998] Tweak future expression to call with '...' arguments ... [15:31:45.998] { [15:31:45.998] do.call(function(...) { [15:31:45.998] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:45.998] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:45.998] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:45.998] on.exit(options(oopts), add = TRUE) [15:31:45.998] } [15:31:45.998] { [15:31:45.998] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:45.998] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:45.998] ...future.FUN(...future.X_jj, ...) [15:31:45.998] }) [15:31:45.998] } [15:31:45.998] }, args = future.call.arguments) [15:31:45.998] } [15:31:45.999] Tweak future expression to call with '...' arguments ... DONE [15:31:46.000] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.000] [15:31:46.001] getGlobalsAndPackages() ... DONE [15:31:46.001] run() for 'Future' ... [15:31:46.002] - state: 'created' [15:31:46.002] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:46.003] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:46.003] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:46.003] - Field: 'label' [15:31:46.003] - Field: 'local' [15:31:46.004] - Field: 'owner' [15:31:46.004] - Field: 'envir' [15:31:46.004] - Field: 'packages' [15:31:46.005] - Field: 'gc' [15:31:46.005] - Field: 'conditions' [15:31:46.005] - Field: 'expr' [15:31:46.006] - Field: 'uuid' [15:31:46.006] - Field: 'seed' [15:31:46.006] - Field: 'version' [15:31:46.007] - Field: 'result' [15:31:46.007] - Field: 'asynchronous' [15:31:46.007] - Field: 'calls' [15:31:46.008] - Field: 'globals' [15:31:46.008] - Field: 'stdout' [15:31:46.008] - Field: 'earlySignal' [15:31:46.009] - Field: 'lazy' [15:31:46.009] - Field: 'state' [15:31:46.009] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:46.010] - Launch lazy future ... [15:31:46.010] Packages needed by the future expression (n = 0): [15:31:46.010] Packages needed by future strategies (n = 0): [15:31:46.011] { [15:31:46.011] { [15:31:46.011] { [15:31:46.011] ...future.startTime <- base::Sys.time() [15:31:46.011] { [15:31:46.011] { [15:31:46.011] { [15:31:46.011] base::local({ [15:31:46.011] has_future <- base::requireNamespace("future", [15:31:46.011] quietly = TRUE) [15:31:46.011] if (has_future) { [15:31:46.011] ns <- base::getNamespace("future") [15:31:46.011] version <- ns[[".package"]][["version"]] [15:31:46.011] if (is.null(version)) [15:31:46.011] version <- utils::packageVersion("future") [15:31:46.011] } [15:31:46.011] else { [15:31:46.011] version <- NULL [15:31:46.011] } [15:31:46.011] if (!has_future || version < "1.8.0") { [15:31:46.011] info <- base::c(r_version = base::gsub("R version ", [15:31:46.011] "", base::R.version$version.string), [15:31:46.011] platform = base::sprintf("%s (%s-bit)", [15:31:46.011] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:46.011] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:46.011] "release", "version")], collapse = " "), [15:31:46.011] hostname = base::Sys.info()[["nodename"]]) [15:31:46.011] info <- base::sprintf("%s: %s", base::names(info), [15:31:46.011] info) [15:31:46.011] info <- base::paste(info, collapse = "; ") [15:31:46.011] if (!has_future) { [15:31:46.011] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:46.011] info) [15:31:46.011] } [15:31:46.011] else { [15:31:46.011] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:46.011] info, version) [15:31:46.011] } [15:31:46.011] base::stop(msg) [15:31:46.011] } [15:31:46.011] }) [15:31:46.011] } [15:31:46.011] ...future.strategy.old <- future::plan("list") [15:31:46.011] options(future.plan = NULL) [15:31:46.011] Sys.unsetenv("R_FUTURE_PLAN") [15:31:46.011] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:46.011] } [15:31:46.011] ...future.workdir <- getwd() [15:31:46.011] } [15:31:46.011] ...future.oldOptions <- base::as.list(base::.Options) [15:31:46.011] ...future.oldEnvVars <- base::Sys.getenv() [15:31:46.011] } [15:31:46.011] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:46.011] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:46.011] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:46.011] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:46.011] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:46.011] future.stdout.windows.reencode = NULL, width = 80L) [15:31:46.011] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:46.011] base::names(...future.oldOptions)) [15:31:46.011] } [15:31:46.011] if (FALSE) { [15:31:46.011] } [15:31:46.011] else { [15:31:46.011] if (TRUE) { [15:31:46.011] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:46.011] open = "w") [15:31:46.011] } [15:31:46.011] else { [15:31:46.011] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:46.011] windows = "NUL", "/dev/null"), open = "w") [15:31:46.011] } [15:31:46.011] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:46.011] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:46.011] base::sink(type = "output", split = FALSE) [15:31:46.011] base::close(...future.stdout) [15:31:46.011] }, add = TRUE) [15:31:46.011] } [15:31:46.011] ...future.frame <- base::sys.nframe() [15:31:46.011] ...future.conditions <- base::list() [15:31:46.011] ...future.rng <- base::globalenv()$.Random.seed [15:31:46.011] if (FALSE) { [15:31:46.011] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:46.011] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:46.011] } [15:31:46.011] ...future.result <- base::tryCatch({ [15:31:46.011] base::withCallingHandlers({ [15:31:46.011] ...future.value <- base::withVisible(base::local({ [15:31:46.011] do.call(function(...) { [15:31:46.011] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.011] if (!identical(...future.globals.maxSize.org, [15:31:46.011] ...future.globals.maxSize)) { [15:31:46.011] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.011] on.exit(options(oopts), add = TRUE) [15:31:46.011] } [15:31:46.011] { [15:31:46.011] lapply(seq_along(...future.elements_ii), [15:31:46.011] FUN = function(jj) { [15:31:46.011] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.011] ...future.FUN(...future.X_jj, ...) [15:31:46.011] }) [15:31:46.011] } [15:31:46.011] }, args = future.call.arguments) [15:31:46.011] })) [15:31:46.011] future::FutureResult(value = ...future.value$value, [15:31:46.011] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:46.011] ...future.rng), globalenv = if (FALSE) [15:31:46.011] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:46.011] ...future.globalenv.names)) [15:31:46.011] else NULL, started = ...future.startTime, version = "1.8") [15:31:46.011] }, condition = base::local({ [15:31:46.011] c <- base::c [15:31:46.011] inherits <- base::inherits [15:31:46.011] invokeRestart <- base::invokeRestart [15:31:46.011] length <- base::length [15:31:46.011] list <- base::list [15:31:46.011] seq.int <- base::seq.int [15:31:46.011] signalCondition <- base::signalCondition [15:31:46.011] sys.calls <- base::sys.calls [15:31:46.011] `[[` <- base::`[[` [15:31:46.011] `+` <- base::`+` [15:31:46.011] `<<-` <- base::`<<-` [15:31:46.011] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:46.011] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:46.011] 3L)] [15:31:46.011] } [15:31:46.011] function(cond) { [15:31:46.011] is_error <- inherits(cond, "error") [15:31:46.011] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:46.011] NULL) [15:31:46.011] if (is_error) { [15:31:46.011] sessionInformation <- function() { [15:31:46.011] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:46.011] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:46.011] search = base::search(), system = base::Sys.info()) [15:31:46.011] } [15:31:46.011] ...future.conditions[[length(...future.conditions) + [15:31:46.011] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:46.011] cond$call), session = sessionInformation(), [15:31:46.011] timestamp = base::Sys.time(), signaled = 0L) [15:31:46.011] signalCondition(cond) [15:31:46.011] } [15:31:46.011] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:46.011] "immediateCondition"))) { [15:31:46.011] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:46.011] ...future.conditions[[length(...future.conditions) + [15:31:46.011] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:46.011] if (TRUE && !signal) { [15:31:46.011] muffleCondition <- function (cond, pattern = "^muffle") [15:31:46.011] { [15:31:46.011] inherits <- base::inherits [15:31:46.011] invokeRestart <- base::invokeRestart [15:31:46.011] is.null <- base::is.null [15:31:46.011] muffled <- FALSE [15:31:46.011] if (inherits(cond, "message")) { [15:31:46.011] muffled <- grepl(pattern, "muffleMessage") [15:31:46.011] if (muffled) [15:31:46.011] invokeRestart("muffleMessage") [15:31:46.011] } [15:31:46.011] else if (inherits(cond, "warning")) { [15:31:46.011] muffled <- grepl(pattern, "muffleWarning") [15:31:46.011] if (muffled) [15:31:46.011] invokeRestart("muffleWarning") [15:31:46.011] } [15:31:46.011] else if (inherits(cond, "condition")) { [15:31:46.011] if (!is.null(pattern)) { [15:31:46.011] computeRestarts <- base::computeRestarts [15:31:46.011] grepl <- base::grepl [15:31:46.011] restarts <- computeRestarts(cond) [15:31:46.011] for (restart in restarts) { [15:31:46.011] name <- restart$name [15:31:46.011] if (is.null(name)) [15:31:46.011] next [15:31:46.011] if (!grepl(pattern, name)) [15:31:46.011] next [15:31:46.011] invokeRestart(restart) [15:31:46.011] muffled <- TRUE [15:31:46.011] break [15:31:46.011] } [15:31:46.011] } [15:31:46.011] } [15:31:46.011] invisible(muffled) [15:31:46.011] } [15:31:46.011] muffleCondition(cond, pattern = "^muffle") [15:31:46.011] } [15:31:46.011] } [15:31:46.011] else { [15:31:46.011] if (TRUE) { [15:31:46.011] muffleCondition <- function (cond, pattern = "^muffle") [15:31:46.011] { [15:31:46.011] inherits <- base::inherits [15:31:46.011] invokeRestart <- base::invokeRestart [15:31:46.011] is.null <- base::is.null [15:31:46.011] muffled <- FALSE [15:31:46.011] if (inherits(cond, "message")) { [15:31:46.011] muffled <- grepl(pattern, "muffleMessage") [15:31:46.011] if (muffled) [15:31:46.011] invokeRestart("muffleMessage") [15:31:46.011] } [15:31:46.011] else if (inherits(cond, "warning")) { [15:31:46.011] muffled <- grepl(pattern, "muffleWarning") [15:31:46.011] if (muffled) [15:31:46.011] invokeRestart("muffleWarning") [15:31:46.011] } [15:31:46.011] else if (inherits(cond, "condition")) { [15:31:46.011] if (!is.null(pattern)) { [15:31:46.011] computeRestarts <- base::computeRestarts [15:31:46.011] grepl <- base::grepl [15:31:46.011] restarts <- computeRestarts(cond) [15:31:46.011] for (restart in restarts) { [15:31:46.011] name <- restart$name [15:31:46.011] if (is.null(name)) [15:31:46.011] next [15:31:46.011] if (!grepl(pattern, name)) [15:31:46.011] next [15:31:46.011] invokeRestart(restart) [15:31:46.011] muffled <- TRUE [15:31:46.011] break [15:31:46.011] } [15:31:46.011] } [15:31:46.011] } [15:31:46.011] invisible(muffled) [15:31:46.011] } [15:31:46.011] muffleCondition(cond, pattern = "^muffle") [15:31:46.011] } [15:31:46.011] } [15:31:46.011] } [15:31:46.011] })) [15:31:46.011] }, error = function(ex) { [15:31:46.011] base::structure(base::list(value = NULL, visible = NULL, [15:31:46.011] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:46.011] ...future.rng), started = ...future.startTime, [15:31:46.011] finished = Sys.time(), session_uuid = NA_character_, [15:31:46.011] version = "1.8"), class = "FutureResult") [15:31:46.011] }, finally = { [15:31:46.011] if (!identical(...future.workdir, getwd())) [15:31:46.011] setwd(...future.workdir) [15:31:46.011] { [15:31:46.011] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:46.011] ...future.oldOptions$nwarnings <- NULL [15:31:46.011] } [15:31:46.011] base::options(...future.oldOptions) [15:31:46.011] if (.Platform$OS.type == "windows") { [15:31:46.011] old_names <- names(...future.oldEnvVars) [15:31:46.011] envs <- base::Sys.getenv() [15:31:46.011] names <- names(envs) [15:31:46.011] common <- intersect(names, old_names) [15:31:46.011] added <- setdiff(names, old_names) [15:31:46.011] removed <- setdiff(old_names, names) [15:31:46.011] changed <- common[...future.oldEnvVars[common] != [15:31:46.011] envs[common]] [15:31:46.011] NAMES <- toupper(changed) [15:31:46.011] args <- list() [15:31:46.011] for (kk in seq_along(NAMES)) { [15:31:46.011] name <- changed[[kk]] [15:31:46.011] NAME <- NAMES[[kk]] [15:31:46.011] if (name != NAME && is.element(NAME, old_names)) [15:31:46.011] next [15:31:46.011] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:46.011] } [15:31:46.011] NAMES <- toupper(added) [15:31:46.011] for (kk in seq_along(NAMES)) { [15:31:46.011] name <- added[[kk]] [15:31:46.011] NAME <- NAMES[[kk]] [15:31:46.011] if (name != NAME && is.element(NAME, old_names)) [15:31:46.011] next [15:31:46.011] args[[name]] <- "" [15:31:46.011] } [15:31:46.011] NAMES <- toupper(removed) [15:31:46.011] for (kk in seq_along(NAMES)) { [15:31:46.011] name <- removed[[kk]] [15:31:46.011] NAME <- NAMES[[kk]] [15:31:46.011] if (name != NAME && is.element(NAME, old_names)) [15:31:46.011] next [15:31:46.011] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:46.011] } [15:31:46.011] if (length(args) > 0) [15:31:46.011] base::do.call(base::Sys.setenv, args = args) [15:31:46.011] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:46.011] } [15:31:46.011] else { [15:31:46.011] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:46.011] } [15:31:46.011] { [15:31:46.011] if (base::length(...future.futureOptionsAdded) > [15:31:46.011] 0L) { [15:31:46.011] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:46.011] base::names(opts) <- ...future.futureOptionsAdded [15:31:46.011] base::options(opts) [15:31:46.011] } [15:31:46.011] { [15:31:46.011] { [15:31:46.011] NULL [15:31:46.011] RNGkind("Mersenne-Twister") [15:31:46.011] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:46.011] inherits = FALSE) [15:31:46.011] } [15:31:46.011] options(future.plan = NULL) [15:31:46.011] if (is.na(NA_character_)) [15:31:46.011] Sys.unsetenv("R_FUTURE_PLAN") [15:31:46.011] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:46.011] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:46.011] .init = FALSE) [15:31:46.011] } [15:31:46.011] } [15:31:46.011] } [15:31:46.011] }) [15:31:46.011] if (TRUE) { [15:31:46.011] base::sink(type = "output", split = FALSE) [15:31:46.011] if (TRUE) { [15:31:46.011] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:46.011] } [15:31:46.011] else { [15:31:46.011] ...future.result["stdout"] <- base::list(NULL) [15:31:46.011] } [15:31:46.011] base::close(...future.stdout) [15:31:46.011] ...future.stdout <- NULL [15:31:46.011] } [15:31:46.011] ...future.result$conditions <- ...future.conditions [15:31:46.011] ...future.result$finished <- base::Sys.time() [15:31:46.011] ...future.result [15:31:46.011] } [15:31:46.019] assign_globals() ... [15:31:46.019] List of 5 [15:31:46.019] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:46.019] $ future.call.arguments :List of 1 [15:31:46.019] ..$ length: int 2 [15:31:46.019] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.019] $ ...future.elements_ii :List of 4 [15:31:46.019] ..$ a: chr "integer" [15:31:46.019] ..$ b: chr "numeric" [15:31:46.019] ..$ c: chr "character" [15:31:46.019] ..$ c: chr "list" [15:31:46.019] $ ...future.seeds_ii : NULL [15:31:46.019] $ ...future.globals.maxSize: NULL [15:31:46.019] - attr(*, "where")=List of 5 [15:31:46.019] ..$ ...future.FUN : [15:31:46.019] ..$ future.call.arguments : [15:31:46.019] ..$ ...future.elements_ii : [15:31:46.019] ..$ ...future.seeds_ii : [15:31:46.019] ..$ ...future.globals.maxSize: [15:31:46.019] - attr(*, "resolved")= logi FALSE [15:31:46.019] - attr(*, "total_size")= num 2240 [15:31:46.019] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.019] - attr(*, "already-done")= logi TRUE [15:31:46.033] - copied '...future.FUN' to environment [15:31:46.033] - copied 'future.call.arguments' to environment [15:31:46.033] - copied '...future.elements_ii' to environment [15:31:46.034] - copied '...future.seeds_ii' to environment [15:31:46.034] - copied '...future.globals.maxSize' to environment [15:31:46.034] assign_globals() ... done [15:31:46.035] plan(): Setting new future strategy stack: [15:31:46.035] List of future strategies: [15:31:46.035] 1. sequential: [15:31:46.035] - args: function (..., envir = parent.frame(), workers = "") [15:31:46.035] - tweaked: FALSE [15:31:46.035] - call: NULL [15:31:46.036] plan(): nbrOfWorkers() = 1 [15:31:46.038] plan(): Setting new future strategy stack: [15:31:46.038] List of future strategies: [15:31:46.038] 1. sequential: [15:31:46.038] - args: function (..., envir = parent.frame(), workers = "") [15:31:46.038] - tweaked: FALSE [15:31:46.038] - call: plan(strategy) [15:31:46.039] plan(): nbrOfWorkers() = 1 [15:31:46.039] SequentialFuture started (and completed) [15:31:46.040] - Launch lazy future ... done [15:31:46.040] run() for 'SequentialFuture' ... done [15:31:46.040] Created future: [15:31:46.041] SequentialFuture: [15:31:46.041] Label: 'future_lapply-1' [15:31:46.041] Expression: [15:31:46.041] { [15:31:46.041] do.call(function(...) { [15:31:46.041] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.041] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:46.041] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.041] on.exit(options(oopts), add = TRUE) [15:31:46.041] } [15:31:46.041] { [15:31:46.041] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:46.041] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.041] ...future.FUN(...future.X_jj, ...) [15:31:46.041] }) [15:31:46.041] } [15:31:46.041] }, args = future.call.arguments) [15:31:46.041] } [15:31:46.041] Lazy evaluation: FALSE [15:31:46.041] Asynchronous evaluation: FALSE [15:31:46.041] Local evaluation: TRUE [15:31:46.041] Environment: R_GlobalEnv [15:31:46.041] Capture standard output: TRUE [15:31:46.041] Capture condition classes: 'condition' (excluding 'nothing') [15:31:46.041] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:46.041] Packages: [15:31:46.041] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:46.041] Resolved: TRUE [15:31:46.041] Value: 240 bytes of class 'list' [15:31:46.041] Early signaling: FALSE [15:31:46.041] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:46.041] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:46.043] Chunk #1 of 1 ... DONE [15:31:46.043] Launching 1 futures (chunks) ... DONE [15:31:46.043] Resolving 1 futures (chunks) ... [15:31:46.043] resolve() on list ... [15:31:46.044] recursive: 0 [15:31:46.044] length: 1 [15:31:46.044] [15:31:46.044] resolved() for 'SequentialFuture' ... [15:31:46.045] - state: 'finished' [15:31:46.045] - run: TRUE [15:31:46.045] - result: 'FutureResult' [15:31:46.045] resolved() for 'SequentialFuture' ... done [15:31:46.046] Future #1 [15:31:46.046] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:46.046] - nx: 1 [15:31:46.047] - relay: TRUE [15:31:46.047] - stdout: TRUE [15:31:46.047] - signal: TRUE [15:31:46.047] - resignal: FALSE [15:31:46.047] - force: TRUE [15:31:46.048] - relayed: [n=1] FALSE [15:31:46.048] - queued futures: [n=1] FALSE [15:31:46.048] - until=1 [15:31:46.048] - relaying element #1 [15:31:46.049] - relayed: [n=1] TRUE [15:31:46.049] - queued futures: [n=1] TRUE [15:31:46.049] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:46.050] length: 0 (resolved future 1) [15:31:46.050] Relaying remaining futures [15:31:46.050] signalConditionsASAP(NULL, pos=0) ... [15:31:46.050] - nx: 1 [15:31:46.051] - relay: TRUE [15:31:46.051] - stdout: TRUE [15:31:46.051] - signal: TRUE [15:31:46.051] - resignal: FALSE [15:31:46.051] - force: TRUE [15:31:46.052] - relayed: [n=1] TRUE [15:31:46.052] - queued futures: [n=1] TRUE - flush all [15:31:46.052] - relayed: [n=1] TRUE [15:31:46.053] - queued futures: [n=1] TRUE [15:31:46.053] signalConditionsASAP(NULL, pos=0) ... done [15:31:46.053] resolve() on list ... DONE [15:31:46.053] - Number of value chunks collected: 1 [15:31:46.054] Resolving 1 futures (chunks) ... DONE [15:31:46.054] Reducing values from 1 chunks ... [15:31:46.054] - Number of values collected after concatenation: 4 [15:31:46.054] - Number of values expected: 4 [15:31:46.055] Reducing values from 1 chunks ... DONE [15:31:46.055] 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, ...) ... [15:31:46.059] future_lapply() ... [15:31:46.060] Number of chunks: 1 [15:31:46.061] getGlobalsAndPackagesXApply() ... [15:31:46.061] - future.globals: TRUE [15:31:46.061] getGlobalsAndPackages() ... [15:31:46.061] Searching for globals... [15:31:46.064] - globals found: [2] 'FUN', '.Internal' [15:31:46.064] Searching for globals ... DONE [15:31:46.064] Resolving globals: FALSE [15:31:46.065] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:46.065] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:46.066] - globals: [1] 'FUN' [15:31:46.066] [15:31:46.066] getGlobalsAndPackages() ... DONE [15:31:46.067] - globals found/used: [n=1] 'FUN' [15:31:46.067] - needed namespaces: [n=0] [15:31:46.067] Finding globals ... DONE [15:31:46.067] - use_args: TRUE [15:31:46.068] - Getting '...' globals ... [15:31:46.068] resolve() on list ... [15:31:46.068] recursive: 0 [15:31:46.069] length: 1 [15:31:46.069] elements: '...' [15:31:46.069] length: 0 (resolved future 1) [15:31:46.069] resolve() on list ... DONE [15:31:46.070] - '...' content: [n=1] 'length' [15:31:46.073] List of 1 [15:31:46.073] $ ...:List of 1 [15:31:46.073] ..$ length: int 2 [15:31:46.073] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.073] - attr(*, "where")=List of 1 [15:31:46.073] ..$ ...: [15:31:46.073] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.073] - attr(*, "resolved")= logi TRUE [15:31:46.073] - attr(*, "total_size")= num NA [15:31:46.079] - Getting '...' globals ... DONE [15:31:46.079] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:46.079] List of 2 [15:31:46.079] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:46.079] $ ... :List of 1 [15:31:46.079] ..$ length: int 2 [15:31:46.079] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.079] - attr(*, "where")=List of 2 [15:31:46.079] ..$ ...future.FUN: [15:31:46.079] ..$ ... : [15:31:46.079] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.079] - attr(*, "resolved")= logi FALSE [15:31:46.079] - attr(*, "total_size")= num 2240 [15:31:46.085] Packages to be attached in all futures: [n=0] [15:31:46.085] getGlobalsAndPackagesXApply() ... DONE [15:31:46.086] Number of futures (= number of chunks): 1 [15:31:46.086] Launching 1 futures (chunks) ... [15:31:46.087] Chunk #1 of 1 ... [15:31:46.087] - Finding globals in 'X' for chunk #1 ... [15:31:46.087] getGlobalsAndPackages() ... [15:31:46.087] Searching for globals... [15:31:46.088] [15:31:46.088] Searching for globals ... DONE [15:31:46.089] - globals: [0] [15:31:46.089] getGlobalsAndPackages() ... DONE [15:31:46.089] + additional globals found: [n=0] [15:31:46.089] + additional namespaces needed: [n=0] [15:31:46.090] - Finding globals in 'X' for chunk #1 ... DONE [15:31:46.090] - seeds: [15:31:46.090] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.090] getGlobalsAndPackages() ... [15:31:46.091] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.091] Resolving globals: FALSE [15:31:46.091] Tweak future expression to call with '...' arguments ... [15:31:46.091] { [15:31:46.091] do.call(function(...) { [15:31:46.091] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.091] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:46.091] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.091] on.exit(options(oopts), add = TRUE) [15:31:46.091] } [15:31:46.091] { [15:31:46.091] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:46.091] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.091] ...future.FUN(...future.X_jj, ...) [15:31:46.091] }) [15:31:46.091] } [15:31:46.091] }, args = future.call.arguments) [15:31:46.091] } [15:31:46.092] Tweak future expression to call with '...' arguments ... DONE [15:31:46.093] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.093] [15:31:46.094] getGlobalsAndPackages() ... DONE [15:31:46.094] run() for 'Future' ... [15:31:46.095] - state: 'created' [15:31:46.095] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:46.096] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:46.096] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:46.096] - Field: 'label' [15:31:46.097] - Field: 'local' [15:31:46.097] - Field: 'owner' [15:31:46.097] - Field: 'envir' [15:31:46.097] - Field: 'packages' [15:31:46.098] - Field: 'gc' [15:31:46.098] - Field: 'conditions' [15:31:46.098] - Field: 'expr' [15:31:46.099] - Field: 'uuid' [15:31:46.099] - Field: 'seed' [15:31:46.099] - Field: 'version' [15:31:46.100] - Field: 'result' [15:31:46.100] - Field: 'asynchronous' [15:31:46.100] - Field: 'calls' [15:31:46.100] - Field: 'globals' [15:31:46.101] - Field: 'stdout' [15:31:46.101] - Field: 'earlySignal' [15:31:46.101] - Field: 'lazy' [15:31:46.102] - Field: 'state' [15:31:46.102] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:46.102] - Launch lazy future ... [15:31:46.103] Packages needed by the future expression (n = 0): [15:31:46.103] Packages needed by future strategies (n = 0): [15:31:46.104] { [15:31:46.104] { [15:31:46.104] { [15:31:46.104] ...future.startTime <- base::Sys.time() [15:31:46.104] { [15:31:46.104] { [15:31:46.104] { [15:31:46.104] base::local({ [15:31:46.104] has_future <- base::requireNamespace("future", [15:31:46.104] quietly = TRUE) [15:31:46.104] if (has_future) { [15:31:46.104] ns <- base::getNamespace("future") [15:31:46.104] version <- ns[[".package"]][["version"]] [15:31:46.104] if (is.null(version)) [15:31:46.104] version <- utils::packageVersion("future") [15:31:46.104] } [15:31:46.104] else { [15:31:46.104] version <- NULL [15:31:46.104] } [15:31:46.104] if (!has_future || version < "1.8.0") { [15:31:46.104] info <- base::c(r_version = base::gsub("R version ", [15:31:46.104] "", base::R.version$version.string), [15:31:46.104] platform = base::sprintf("%s (%s-bit)", [15:31:46.104] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:46.104] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:46.104] "release", "version")], collapse = " "), [15:31:46.104] hostname = base::Sys.info()[["nodename"]]) [15:31:46.104] info <- base::sprintf("%s: %s", base::names(info), [15:31:46.104] info) [15:31:46.104] info <- base::paste(info, collapse = "; ") [15:31:46.104] if (!has_future) { [15:31:46.104] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:46.104] info) [15:31:46.104] } [15:31:46.104] else { [15:31:46.104] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:46.104] info, version) [15:31:46.104] } [15:31:46.104] base::stop(msg) [15:31:46.104] } [15:31:46.104] }) [15:31:46.104] } [15:31:46.104] ...future.strategy.old <- future::plan("list") [15:31:46.104] options(future.plan = NULL) [15:31:46.104] Sys.unsetenv("R_FUTURE_PLAN") [15:31:46.104] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:46.104] } [15:31:46.104] ...future.workdir <- getwd() [15:31:46.104] } [15:31:46.104] ...future.oldOptions <- base::as.list(base::.Options) [15:31:46.104] ...future.oldEnvVars <- base::Sys.getenv() [15:31:46.104] } [15:31:46.104] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:46.104] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:46.104] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:46.104] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:46.104] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:46.104] future.stdout.windows.reencode = NULL, width = 80L) [15:31:46.104] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:46.104] base::names(...future.oldOptions)) [15:31:46.104] } [15:31:46.104] if (FALSE) { [15:31:46.104] } [15:31:46.104] else { [15:31:46.104] if (TRUE) { [15:31:46.104] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:46.104] open = "w") [15:31:46.104] } [15:31:46.104] else { [15:31:46.104] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:46.104] windows = "NUL", "/dev/null"), open = "w") [15:31:46.104] } [15:31:46.104] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:46.104] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:46.104] base::sink(type = "output", split = FALSE) [15:31:46.104] base::close(...future.stdout) [15:31:46.104] }, add = TRUE) [15:31:46.104] } [15:31:46.104] ...future.frame <- base::sys.nframe() [15:31:46.104] ...future.conditions <- base::list() [15:31:46.104] ...future.rng <- base::globalenv()$.Random.seed [15:31:46.104] if (FALSE) { [15:31:46.104] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:46.104] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:46.104] } [15:31:46.104] ...future.result <- base::tryCatch({ [15:31:46.104] base::withCallingHandlers({ [15:31:46.104] ...future.value <- base::withVisible(base::local({ [15:31:46.104] do.call(function(...) { [15:31:46.104] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.104] if (!identical(...future.globals.maxSize.org, [15:31:46.104] ...future.globals.maxSize)) { [15:31:46.104] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.104] on.exit(options(oopts), add = TRUE) [15:31:46.104] } [15:31:46.104] { [15:31:46.104] lapply(seq_along(...future.elements_ii), [15:31:46.104] FUN = function(jj) { [15:31:46.104] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.104] ...future.FUN(...future.X_jj, ...) [15:31:46.104] }) [15:31:46.104] } [15:31:46.104] }, args = future.call.arguments) [15:31:46.104] })) [15:31:46.104] future::FutureResult(value = ...future.value$value, [15:31:46.104] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:46.104] ...future.rng), globalenv = if (FALSE) [15:31:46.104] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:46.104] ...future.globalenv.names)) [15:31:46.104] else NULL, started = ...future.startTime, version = "1.8") [15:31:46.104] }, condition = base::local({ [15:31:46.104] c <- base::c [15:31:46.104] inherits <- base::inherits [15:31:46.104] invokeRestart <- base::invokeRestart [15:31:46.104] length <- base::length [15:31:46.104] list <- base::list [15:31:46.104] seq.int <- base::seq.int [15:31:46.104] signalCondition <- base::signalCondition [15:31:46.104] sys.calls <- base::sys.calls [15:31:46.104] `[[` <- base::`[[` [15:31:46.104] `+` <- base::`+` [15:31:46.104] `<<-` <- base::`<<-` [15:31:46.104] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:46.104] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:46.104] 3L)] [15:31:46.104] } [15:31:46.104] function(cond) { [15:31:46.104] is_error <- inherits(cond, "error") [15:31:46.104] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:46.104] NULL) [15:31:46.104] if (is_error) { [15:31:46.104] sessionInformation <- function() { [15:31:46.104] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:46.104] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:46.104] search = base::search(), system = base::Sys.info()) [15:31:46.104] } [15:31:46.104] ...future.conditions[[length(...future.conditions) + [15:31:46.104] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:46.104] cond$call), session = sessionInformation(), [15:31:46.104] timestamp = base::Sys.time(), signaled = 0L) [15:31:46.104] signalCondition(cond) [15:31:46.104] } [15:31:46.104] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:46.104] "immediateCondition"))) { [15:31:46.104] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:46.104] ...future.conditions[[length(...future.conditions) + [15:31:46.104] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:46.104] if (TRUE && !signal) { [15:31:46.104] muffleCondition <- function (cond, pattern = "^muffle") [15:31:46.104] { [15:31:46.104] inherits <- base::inherits [15:31:46.104] invokeRestart <- base::invokeRestart [15:31:46.104] is.null <- base::is.null [15:31:46.104] muffled <- FALSE [15:31:46.104] if (inherits(cond, "message")) { [15:31:46.104] muffled <- grepl(pattern, "muffleMessage") [15:31:46.104] if (muffled) [15:31:46.104] invokeRestart("muffleMessage") [15:31:46.104] } [15:31:46.104] else if (inherits(cond, "warning")) { [15:31:46.104] muffled <- grepl(pattern, "muffleWarning") [15:31:46.104] if (muffled) [15:31:46.104] invokeRestart("muffleWarning") [15:31:46.104] } [15:31:46.104] else if (inherits(cond, "condition")) { [15:31:46.104] if (!is.null(pattern)) { [15:31:46.104] computeRestarts <- base::computeRestarts [15:31:46.104] grepl <- base::grepl [15:31:46.104] restarts <- computeRestarts(cond) [15:31:46.104] for (restart in restarts) { [15:31:46.104] name <- restart$name [15:31:46.104] if (is.null(name)) [15:31:46.104] next [15:31:46.104] if (!grepl(pattern, name)) [15:31:46.104] next [15:31:46.104] invokeRestart(restart) [15:31:46.104] muffled <- TRUE [15:31:46.104] break [15:31:46.104] } [15:31:46.104] } [15:31:46.104] } [15:31:46.104] invisible(muffled) [15:31:46.104] } [15:31:46.104] muffleCondition(cond, pattern = "^muffle") [15:31:46.104] } [15:31:46.104] } [15:31:46.104] else { [15:31:46.104] if (TRUE) { [15:31:46.104] muffleCondition <- function (cond, pattern = "^muffle") [15:31:46.104] { [15:31:46.104] inherits <- base::inherits [15:31:46.104] invokeRestart <- base::invokeRestart [15:31:46.104] is.null <- base::is.null [15:31:46.104] muffled <- FALSE [15:31:46.104] if (inherits(cond, "message")) { [15:31:46.104] muffled <- grepl(pattern, "muffleMessage") [15:31:46.104] if (muffled) [15:31:46.104] invokeRestart("muffleMessage") [15:31:46.104] } [15:31:46.104] else if (inherits(cond, "warning")) { [15:31:46.104] muffled <- grepl(pattern, "muffleWarning") [15:31:46.104] if (muffled) [15:31:46.104] invokeRestart("muffleWarning") [15:31:46.104] } [15:31:46.104] else if (inherits(cond, "condition")) { [15:31:46.104] if (!is.null(pattern)) { [15:31:46.104] computeRestarts <- base::computeRestarts [15:31:46.104] grepl <- base::grepl [15:31:46.104] restarts <- computeRestarts(cond) [15:31:46.104] for (restart in restarts) { [15:31:46.104] name <- restart$name [15:31:46.104] if (is.null(name)) [15:31:46.104] next [15:31:46.104] if (!grepl(pattern, name)) [15:31:46.104] next [15:31:46.104] invokeRestart(restart) [15:31:46.104] muffled <- TRUE [15:31:46.104] break [15:31:46.104] } [15:31:46.104] } [15:31:46.104] } [15:31:46.104] invisible(muffled) [15:31:46.104] } [15:31:46.104] muffleCondition(cond, pattern = "^muffle") [15:31:46.104] } [15:31:46.104] } [15:31:46.104] } [15:31:46.104] })) [15:31:46.104] }, error = function(ex) { [15:31:46.104] base::structure(base::list(value = NULL, visible = NULL, [15:31:46.104] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:46.104] ...future.rng), started = ...future.startTime, [15:31:46.104] finished = Sys.time(), session_uuid = NA_character_, [15:31:46.104] version = "1.8"), class = "FutureResult") [15:31:46.104] }, finally = { [15:31:46.104] if (!identical(...future.workdir, getwd())) [15:31:46.104] setwd(...future.workdir) [15:31:46.104] { [15:31:46.104] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:46.104] ...future.oldOptions$nwarnings <- NULL [15:31:46.104] } [15:31:46.104] base::options(...future.oldOptions) [15:31:46.104] if (.Platform$OS.type == "windows") { [15:31:46.104] old_names <- names(...future.oldEnvVars) [15:31:46.104] envs <- base::Sys.getenv() [15:31:46.104] names <- names(envs) [15:31:46.104] common <- intersect(names, old_names) [15:31:46.104] added <- setdiff(names, old_names) [15:31:46.104] removed <- setdiff(old_names, names) [15:31:46.104] changed <- common[...future.oldEnvVars[common] != [15:31:46.104] envs[common]] [15:31:46.104] NAMES <- toupper(changed) [15:31:46.104] args <- list() [15:31:46.104] for (kk in seq_along(NAMES)) { [15:31:46.104] name <- changed[[kk]] [15:31:46.104] NAME <- NAMES[[kk]] [15:31:46.104] if (name != NAME && is.element(NAME, old_names)) [15:31:46.104] next [15:31:46.104] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:46.104] } [15:31:46.104] NAMES <- toupper(added) [15:31:46.104] for (kk in seq_along(NAMES)) { [15:31:46.104] name <- added[[kk]] [15:31:46.104] NAME <- NAMES[[kk]] [15:31:46.104] if (name != NAME && is.element(NAME, old_names)) [15:31:46.104] next [15:31:46.104] args[[name]] <- "" [15:31:46.104] } [15:31:46.104] NAMES <- toupper(removed) [15:31:46.104] for (kk in seq_along(NAMES)) { [15:31:46.104] name <- removed[[kk]] [15:31:46.104] NAME <- NAMES[[kk]] [15:31:46.104] if (name != NAME && is.element(NAME, old_names)) [15:31:46.104] next [15:31:46.104] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:46.104] } [15:31:46.104] if (length(args) > 0) [15:31:46.104] base::do.call(base::Sys.setenv, args = args) [15:31:46.104] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:46.104] } [15:31:46.104] else { [15:31:46.104] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:46.104] } [15:31:46.104] { [15:31:46.104] if (base::length(...future.futureOptionsAdded) > [15:31:46.104] 0L) { [15:31:46.104] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:46.104] base::names(opts) <- ...future.futureOptionsAdded [15:31:46.104] base::options(opts) [15:31:46.104] } [15:31:46.104] { [15:31:46.104] { [15:31:46.104] NULL [15:31:46.104] RNGkind("Mersenne-Twister") [15:31:46.104] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:46.104] inherits = FALSE) [15:31:46.104] } [15:31:46.104] options(future.plan = NULL) [15:31:46.104] if (is.na(NA_character_)) [15:31:46.104] Sys.unsetenv("R_FUTURE_PLAN") [15:31:46.104] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:46.104] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:46.104] .init = FALSE) [15:31:46.104] } [15:31:46.104] } [15:31:46.104] } [15:31:46.104] }) [15:31:46.104] if (TRUE) { [15:31:46.104] base::sink(type = "output", split = FALSE) [15:31:46.104] if (TRUE) { [15:31:46.104] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:46.104] } [15:31:46.104] else { [15:31:46.104] ...future.result["stdout"] <- base::list(NULL) [15:31:46.104] } [15:31:46.104] base::close(...future.stdout) [15:31:46.104] ...future.stdout <- NULL [15:31:46.104] } [15:31:46.104] ...future.result$conditions <- ...future.conditions [15:31:46.104] ...future.result$finished <- base::Sys.time() [15:31:46.104] ...future.result [15:31:46.104] } [15:31:46.111] assign_globals() ... [15:31:46.111] List of 5 [15:31:46.111] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:46.111] $ future.call.arguments :List of 1 [15:31:46.111] ..$ length: int 2 [15:31:46.111] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.111] $ ...future.elements_ii :List of 4 [15:31:46.111] ..$ a: chr "integer" [15:31:46.111] ..$ b: chr "numeric" [15:31:46.111] ..$ c: chr "character" [15:31:46.111] ..$ c: chr "list" [15:31:46.111] $ ...future.seeds_ii : NULL [15:31:46.111] $ ...future.globals.maxSize: NULL [15:31:46.111] - attr(*, "where")=List of 5 [15:31:46.111] ..$ ...future.FUN : [15:31:46.111] ..$ future.call.arguments : [15:31:46.111] ..$ ...future.elements_ii : [15:31:46.111] ..$ ...future.seeds_ii : [15:31:46.111] ..$ ...future.globals.maxSize: [15:31:46.111] - attr(*, "resolved")= logi FALSE [15:31:46.111] - attr(*, "total_size")= num 2240 [15:31:46.111] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.111] - attr(*, "already-done")= logi TRUE [15:31:46.125] - copied '...future.FUN' to environment [15:31:46.126] - copied 'future.call.arguments' to environment [15:31:46.126] - copied '...future.elements_ii' to environment [15:31:46.126] - copied '...future.seeds_ii' to environment [15:31:46.126] - copied '...future.globals.maxSize' to environment [15:31:46.127] assign_globals() ... done [15:31:46.127] plan(): Setting new future strategy stack: [15:31:46.128] List of future strategies: [15:31:46.128] 1. sequential: [15:31:46.128] - args: function (..., envir = parent.frame(), workers = "") [15:31:46.128] - tweaked: FALSE [15:31:46.128] - call: NULL [15:31:46.128] plan(): nbrOfWorkers() = 1 [15:31:46.130] plan(): Setting new future strategy stack: [15:31:46.131] List of future strategies: [15:31:46.131] 1. sequential: [15:31:46.131] - args: function (..., envir = parent.frame(), workers = "") [15:31:46.131] - tweaked: FALSE [15:31:46.131] - call: plan(strategy) [15:31:46.132] plan(): nbrOfWorkers() = 1 [15:31:46.132] SequentialFuture started (and completed) [15:31:46.132] - Launch lazy future ... done [15:31:46.133] run() for 'SequentialFuture' ... done [15:31:46.133] Created future: [15:31:46.133] SequentialFuture: [15:31:46.133] Label: 'future_lapply-1' [15:31:46.133] Expression: [15:31:46.133] { [15:31:46.133] do.call(function(...) { [15:31:46.133] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.133] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:46.133] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.133] on.exit(options(oopts), add = TRUE) [15:31:46.133] } [15:31:46.133] { [15:31:46.133] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:46.133] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.133] ...future.FUN(...future.X_jj, ...) [15:31:46.133] }) [15:31:46.133] } [15:31:46.133] }, args = future.call.arguments) [15:31:46.133] } [15:31:46.133] Lazy evaluation: FALSE [15:31:46.133] Asynchronous evaluation: FALSE [15:31:46.133] Local evaluation: TRUE [15:31:46.133] Environment: R_GlobalEnv [15:31:46.133] Capture standard output: TRUE [15:31:46.133] Capture condition classes: 'condition' (excluding 'nothing') [15:31:46.133] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:46.133] Packages: [15:31:46.133] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:46.133] Resolved: TRUE [15:31:46.133] Value: 240 bytes of class 'list' [15:31:46.133] Early signaling: FALSE [15:31:46.133] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:46.133] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:46.136] Chunk #1 of 1 ... DONE [15:31:46.136] Launching 1 futures (chunks) ... DONE [15:31:46.136] Resolving 1 futures (chunks) ... [15:31:46.136] resolve() on list ... [15:31:46.137] recursive: 0 [15:31:46.137] length: 1 [15:31:46.137] [15:31:46.137] resolved() for 'SequentialFuture' ... [15:31:46.138] - state: 'finished' [15:31:46.138] - run: TRUE [15:31:46.138] - result: 'FutureResult' [15:31:46.139] resolved() for 'SequentialFuture' ... done [15:31:46.139] Future #1 [15:31:46.139] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:46.140] - nx: 1 [15:31:46.140] - relay: TRUE [15:31:46.140] - stdout: TRUE [15:31:46.140] - signal: TRUE [15:31:46.141] - resignal: FALSE [15:31:46.141] - force: TRUE [15:31:46.141] - relayed: [n=1] FALSE [15:31:46.141] - queued futures: [n=1] FALSE [15:31:46.142] - until=1 [15:31:46.142] - relaying element #1 [15:31:46.143] - relayed: [n=1] TRUE [15:31:46.143] - queued futures: [n=1] TRUE [15:31:46.143] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:46.143] length: 0 (resolved future 1) [15:31:46.144] Relaying remaining futures [15:31:46.144] signalConditionsASAP(NULL, pos=0) ... [15:31:46.144] - nx: 1 [15:31:46.144] - relay: TRUE [15:31:46.145] - stdout: TRUE [15:31:46.145] - signal: TRUE [15:31:46.145] - resignal: FALSE [15:31:46.146] - force: TRUE [15:31:46.146] - relayed: [n=1] TRUE [15:31:46.146] - queued futures: [n=1] TRUE - flush all [15:31:46.146] - relayed: [n=1] TRUE [15:31:46.147] - queued futures: [n=1] TRUE [15:31:46.147] signalConditionsASAP(NULL, pos=0) ... done [15:31:46.147] resolve() on list ... DONE [15:31:46.148] - Number of value chunks collected: 1 [15:31:46.148] Resolving 1 futures (chunks) ... DONE [15:31:46.148] Reducing values from 1 chunks ... [15:31:46.148] - Number of values collected after concatenation: 4 [15:31:46.149] - Number of values expected: 4 [15:31:46.149] Reducing values from 1 chunks ... DONE [15:31:46.149] 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, ...) ... [15:31:46.153] future_lapply() ... [15:31:46.169] Number of chunks: 1 [15:31:46.169] getGlobalsAndPackagesXApply() ... [15:31:46.169] - future.globals: TRUE [15:31:46.169] getGlobalsAndPackages() ... [15:31:46.170] Searching for globals... [15:31:46.184] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [15:31:46.184] Searching for globals ... DONE [15:31:46.185] Resolving globals: FALSE [15:31:46.186] The total size of the 1 globals is 69.62 KiB (71288 bytes) [15:31:46.187] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 69.62 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (69.62 KiB of class 'function') [15:31:46.187] - globals: [1] 'FUN' [15:31:46.187] - packages: [1] 'future' [15:31:46.190] getGlobalsAndPackages() ... DONE [15:31:46.191] - globals found/used: [n=1] 'FUN' [15:31:46.191] - needed namespaces: [n=1] 'future' [15:31:46.191] Finding globals ... DONE [15:31:46.192] - use_args: TRUE [15:31:46.192] - Getting '...' globals ... [15:31:46.192] resolve() on list ... [15:31:46.193] recursive: 0 [15:31:46.193] length: 1 [15:31:46.193] elements: '...' [15:31:46.194] length: 0 (resolved future 1) [15:31:46.194] resolve() on list ... DONE [15:31:46.194] - '...' content: [n=2] 'collapse', 'maxHead' [15:31:46.194] List of 1 [15:31:46.194] $ ...:List of 2 [15:31:46.194] ..$ collapse: chr "; " [15:31:46.194] ..$ maxHead : int 3 [15:31:46.194] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.194] - attr(*, "where")=List of 1 [15:31:46.194] ..$ ...: [15:31:46.194] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.194] - attr(*, "resolved")= logi TRUE [15:31:46.194] - attr(*, "total_size")= num NA [15:31:46.200] - Getting '...' globals ... DONE [15:31:46.200] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:46.201] List of 2 [15:31:46.201] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:46.201] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:46.201] $ ... :List of 2 [15:31:46.201] ..$ collapse: chr "; " [15:31:46.201] ..$ maxHead : int 3 [15:31:46.201] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.201] - attr(*, "where")=List of 2 [15:31:46.201] ..$ ...future.FUN: [15:31:46.201] ..$ ... : [15:31:46.201] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.201] - attr(*, "resolved")= logi FALSE [15:31:46.201] - attr(*, "total_size")= num 71456 [15:31:46.206] Packages to be attached in all futures: [n=1] 'future' [15:31:46.207] getGlobalsAndPackagesXApply() ... DONE [15:31:46.207] Number of futures (= number of chunks): 1 [15:31:46.207] Launching 1 futures (chunks) ... [15:31:46.208] Chunk #1 of 1 ... [15:31:46.208] - Finding globals in 'X' for chunk #1 ... [15:31:46.208] getGlobalsAndPackages() ... [15:31:46.208] Searching for globals... [15:31:46.209] [15:31:46.209] Searching for globals ... DONE [15:31:46.209] - globals: [0] [15:31:46.210] getGlobalsAndPackages() ... DONE [15:31:46.210] + additional globals found: [n=0] [15:31:46.210] + additional namespaces needed: [n=0] [15:31:46.210] - Finding globals in 'X' for chunk #1 ... DONE [15:31:46.211] - seeds: [15:31:46.211] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.211] getGlobalsAndPackages() ... [15:31:46.211] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.212] Resolving globals: FALSE [15:31:46.212] Tweak future expression to call with '...' arguments ... [15:31:46.212] { [15:31:46.212] do.call(function(...) { [15:31:46.212] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.212] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:46.212] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.212] on.exit(options(oopts), add = TRUE) [15:31:46.212] } [15:31:46.212] { [15:31:46.212] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:46.212] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.212] ...future.FUN(...future.X_jj, ...) [15:31:46.212] }) [15:31:46.212] } [15:31:46.212] }, args = future.call.arguments) [15:31:46.212] } [15:31:46.213] Tweak future expression to call with '...' arguments ... DONE [15:31:46.214] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.214] - packages: [1] 'future' [15:31:46.214] getGlobalsAndPackages() ... DONE [15:31:46.215] run() for 'Future' ... [15:31:46.215] - state: 'created' [15:31:46.215] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:46.216] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:46.216] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:46.216] - Field: 'label' [15:31:46.217] - Field: 'local' [15:31:46.217] - Field: 'owner' [15:31:46.217] - Field: 'envir' [15:31:46.217] - Field: 'packages' [15:31:46.218] - Field: 'gc' [15:31:46.218] - Field: 'conditions' [15:31:46.218] - Field: 'expr' [15:31:46.218] - Field: 'uuid' [15:31:46.219] - Field: 'seed' [15:31:46.219] - Field: 'version' [15:31:46.219] - Field: 'result' [15:31:46.220] - Field: 'asynchronous' [15:31:46.220] - Field: 'calls' [15:31:46.220] - Field: 'globals' [15:31:46.220] - Field: 'stdout' [15:31:46.221] - Field: 'earlySignal' [15:31:46.221] - Field: 'lazy' [15:31:46.221] - Field: 'state' [15:31:46.221] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:46.222] - Launch lazy future ... [15:31:46.222] Packages needed by the future expression (n = 1): 'future' [15:31:46.222] Packages needed by future strategies (n = 0): [15:31:46.223] { [15:31:46.223] { [15:31:46.223] { [15:31:46.223] ...future.startTime <- base::Sys.time() [15:31:46.223] { [15:31:46.223] { [15:31:46.223] { [15:31:46.223] { [15:31:46.223] base::local({ [15:31:46.223] has_future <- base::requireNamespace("future", [15:31:46.223] quietly = TRUE) [15:31:46.223] if (has_future) { [15:31:46.223] ns <- base::getNamespace("future") [15:31:46.223] version <- ns[[".package"]][["version"]] [15:31:46.223] if (is.null(version)) [15:31:46.223] version <- utils::packageVersion("future") [15:31:46.223] } [15:31:46.223] else { [15:31:46.223] version <- NULL [15:31:46.223] } [15:31:46.223] if (!has_future || version < "1.8.0") { [15:31:46.223] info <- base::c(r_version = base::gsub("R version ", [15:31:46.223] "", base::R.version$version.string), [15:31:46.223] platform = base::sprintf("%s (%s-bit)", [15:31:46.223] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:46.223] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:46.223] "release", "version")], collapse = " "), [15:31:46.223] hostname = base::Sys.info()[["nodename"]]) [15:31:46.223] info <- base::sprintf("%s: %s", base::names(info), [15:31:46.223] info) [15:31:46.223] info <- base::paste(info, collapse = "; ") [15:31:46.223] if (!has_future) { [15:31:46.223] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:46.223] info) [15:31:46.223] } [15:31:46.223] else { [15:31:46.223] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:46.223] info, version) [15:31:46.223] } [15:31:46.223] base::stop(msg) [15:31:46.223] } [15:31:46.223] }) [15:31:46.223] } [15:31:46.223] base::local({ [15:31:46.223] for (pkg in "future") { [15:31:46.223] base::loadNamespace(pkg) [15:31:46.223] base::library(pkg, character.only = TRUE) [15:31:46.223] } [15:31:46.223] }) [15:31:46.223] } [15:31:46.223] ...future.strategy.old <- future::plan("list") [15:31:46.223] options(future.plan = NULL) [15:31:46.223] Sys.unsetenv("R_FUTURE_PLAN") [15:31:46.223] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:46.223] } [15:31:46.223] ...future.workdir <- getwd() [15:31:46.223] } [15:31:46.223] ...future.oldOptions <- base::as.list(base::.Options) [15:31:46.223] ...future.oldEnvVars <- base::Sys.getenv() [15:31:46.223] } [15:31:46.223] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:46.223] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:46.223] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:46.223] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:46.223] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:46.223] future.stdout.windows.reencode = NULL, width = 80L) [15:31:46.223] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:46.223] base::names(...future.oldOptions)) [15:31:46.223] } [15:31:46.223] if (FALSE) { [15:31:46.223] } [15:31:46.223] else { [15:31:46.223] if (TRUE) { [15:31:46.223] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:46.223] open = "w") [15:31:46.223] } [15:31:46.223] else { [15:31:46.223] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:46.223] windows = "NUL", "/dev/null"), open = "w") [15:31:46.223] } [15:31:46.223] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:46.223] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:46.223] base::sink(type = "output", split = FALSE) [15:31:46.223] base::close(...future.stdout) [15:31:46.223] }, add = TRUE) [15:31:46.223] } [15:31:46.223] ...future.frame <- base::sys.nframe() [15:31:46.223] ...future.conditions <- base::list() [15:31:46.223] ...future.rng <- base::globalenv()$.Random.seed [15:31:46.223] if (FALSE) { [15:31:46.223] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:46.223] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:46.223] } [15:31:46.223] ...future.result <- base::tryCatch({ [15:31:46.223] base::withCallingHandlers({ [15:31:46.223] ...future.value <- base::withVisible(base::local({ [15:31:46.223] do.call(function(...) { [15:31:46.223] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.223] if (!identical(...future.globals.maxSize.org, [15:31:46.223] ...future.globals.maxSize)) { [15:31:46.223] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.223] on.exit(options(oopts), add = TRUE) [15:31:46.223] } [15:31:46.223] { [15:31:46.223] lapply(seq_along(...future.elements_ii), [15:31:46.223] FUN = function(jj) { [15:31:46.223] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.223] ...future.FUN(...future.X_jj, ...) [15:31:46.223] }) [15:31:46.223] } [15:31:46.223] }, args = future.call.arguments) [15:31:46.223] })) [15:31:46.223] future::FutureResult(value = ...future.value$value, [15:31:46.223] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:46.223] ...future.rng), globalenv = if (FALSE) [15:31:46.223] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:46.223] ...future.globalenv.names)) [15:31:46.223] else NULL, started = ...future.startTime, version = "1.8") [15:31:46.223] }, condition = base::local({ [15:31:46.223] c <- base::c [15:31:46.223] inherits <- base::inherits [15:31:46.223] invokeRestart <- base::invokeRestart [15:31:46.223] length <- base::length [15:31:46.223] list <- base::list [15:31:46.223] seq.int <- base::seq.int [15:31:46.223] signalCondition <- base::signalCondition [15:31:46.223] sys.calls <- base::sys.calls [15:31:46.223] `[[` <- base::`[[` [15:31:46.223] `+` <- base::`+` [15:31:46.223] `<<-` <- base::`<<-` [15:31:46.223] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:46.223] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:46.223] 3L)] [15:31:46.223] } [15:31:46.223] function(cond) { [15:31:46.223] is_error <- inherits(cond, "error") [15:31:46.223] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:46.223] NULL) [15:31:46.223] if (is_error) { [15:31:46.223] sessionInformation <- function() { [15:31:46.223] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:46.223] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:46.223] search = base::search(), system = base::Sys.info()) [15:31:46.223] } [15:31:46.223] ...future.conditions[[length(...future.conditions) + [15:31:46.223] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:46.223] cond$call), session = sessionInformation(), [15:31:46.223] timestamp = base::Sys.time(), signaled = 0L) [15:31:46.223] signalCondition(cond) [15:31:46.223] } [15:31:46.223] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:46.223] "immediateCondition"))) { [15:31:46.223] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:46.223] ...future.conditions[[length(...future.conditions) + [15:31:46.223] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:46.223] if (TRUE && !signal) { [15:31:46.223] muffleCondition <- function (cond, pattern = "^muffle") [15:31:46.223] { [15:31:46.223] inherits <- base::inherits [15:31:46.223] invokeRestart <- base::invokeRestart [15:31:46.223] is.null <- base::is.null [15:31:46.223] muffled <- FALSE [15:31:46.223] if (inherits(cond, "message")) { [15:31:46.223] muffled <- grepl(pattern, "muffleMessage") [15:31:46.223] if (muffled) [15:31:46.223] invokeRestart("muffleMessage") [15:31:46.223] } [15:31:46.223] else if (inherits(cond, "warning")) { [15:31:46.223] muffled <- grepl(pattern, "muffleWarning") [15:31:46.223] if (muffled) [15:31:46.223] invokeRestart("muffleWarning") [15:31:46.223] } [15:31:46.223] else if (inherits(cond, "condition")) { [15:31:46.223] if (!is.null(pattern)) { [15:31:46.223] computeRestarts <- base::computeRestarts [15:31:46.223] grepl <- base::grepl [15:31:46.223] restarts <- computeRestarts(cond) [15:31:46.223] for (restart in restarts) { [15:31:46.223] name <- restart$name [15:31:46.223] if (is.null(name)) [15:31:46.223] next [15:31:46.223] if (!grepl(pattern, name)) [15:31:46.223] next [15:31:46.223] invokeRestart(restart) [15:31:46.223] muffled <- TRUE [15:31:46.223] break [15:31:46.223] } [15:31:46.223] } [15:31:46.223] } [15:31:46.223] invisible(muffled) [15:31:46.223] } [15:31:46.223] muffleCondition(cond, pattern = "^muffle") [15:31:46.223] } [15:31:46.223] } [15:31:46.223] else { [15:31:46.223] if (TRUE) { [15:31:46.223] muffleCondition <- function (cond, pattern = "^muffle") [15:31:46.223] { [15:31:46.223] inherits <- base::inherits [15:31:46.223] invokeRestart <- base::invokeRestart [15:31:46.223] is.null <- base::is.null [15:31:46.223] muffled <- FALSE [15:31:46.223] if (inherits(cond, "message")) { [15:31:46.223] muffled <- grepl(pattern, "muffleMessage") [15:31:46.223] if (muffled) [15:31:46.223] invokeRestart("muffleMessage") [15:31:46.223] } [15:31:46.223] else if (inherits(cond, "warning")) { [15:31:46.223] muffled <- grepl(pattern, "muffleWarning") [15:31:46.223] if (muffled) [15:31:46.223] invokeRestart("muffleWarning") [15:31:46.223] } [15:31:46.223] else if (inherits(cond, "condition")) { [15:31:46.223] if (!is.null(pattern)) { [15:31:46.223] computeRestarts <- base::computeRestarts [15:31:46.223] grepl <- base::grepl [15:31:46.223] restarts <- computeRestarts(cond) [15:31:46.223] for (restart in restarts) { [15:31:46.223] name <- restart$name [15:31:46.223] if (is.null(name)) [15:31:46.223] next [15:31:46.223] if (!grepl(pattern, name)) [15:31:46.223] next [15:31:46.223] invokeRestart(restart) [15:31:46.223] muffled <- TRUE [15:31:46.223] break [15:31:46.223] } [15:31:46.223] } [15:31:46.223] } [15:31:46.223] invisible(muffled) [15:31:46.223] } [15:31:46.223] muffleCondition(cond, pattern = "^muffle") [15:31:46.223] } [15:31:46.223] } [15:31:46.223] } [15:31:46.223] })) [15:31:46.223] }, error = function(ex) { [15:31:46.223] base::structure(base::list(value = NULL, visible = NULL, [15:31:46.223] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:46.223] ...future.rng), started = ...future.startTime, [15:31:46.223] finished = Sys.time(), session_uuid = NA_character_, [15:31:46.223] version = "1.8"), class = "FutureResult") [15:31:46.223] }, finally = { [15:31:46.223] if (!identical(...future.workdir, getwd())) [15:31:46.223] setwd(...future.workdir) [15:31:46.223] { [15:31:46.223] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:46.223] ...future.oldOptions$nwarnings <- NULL [15:31:46.223] } [15:31:46.223] base::options(...future.oldOptions) [15:31:46.223] if (.Platform$OS.type == "windows") { [15:31:46.223] old_names <- names(...future.oldEnvVars) [15:31:46.223] envs <- base::Sys.getenv() [15:31:46.223] names <- names(envs) [15:31:46.223] common <- intersect(names, old_names) [15:31:46.223] added <- setdiff(names, old_names) [15:31:46.223] removed <- setdiff(old_names, names) [15:31:46.223] changed <- common[...future.oldEnvVars[common] != [15:31:46.223] envs[common]] [15:31:46.223] NAMES <- toupper(changed) [15:31:46.223] args <- list() [15:31:46.223] for (kk in seq_along(NAMES)) { [15:31:46.223] name <- changed[[kk]] [15:31:46.223] NAME <- NAMES[[kk]] [15:31:46.223] if (name != NAME && is.element(NAME, old_names)) [15:31:46.223] next [15:31:46.223] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:46.223] } [15:31:46.223] NAMES <- toupper(added) [15:31:46.223] for (kk in seq_along(NAMES)) { [15:31:46.223] name <- added[[kk]] [15:31:46.223] NAME <- NAMES[[kk]] [15:31:46.223] if (name != NAME && is.element(NAME, old_names)) [15:31:46.223] next [15:31:46.223] args[[name]] <- "" [15:31:46.223] } [15:31:46.223] NAMES <- toupper(removed) [15:31:46.223] for (kk in seq_along(NAMES)) { [15:31:46.223] name <- removed[[kk]] [15:31:46.223] NAME <- NAMES[[kk]] [15:31:46.223] if (name != NAME && is.element(NAME, old_names)) [15:31:46.223] next [15:31:46.223] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:46.223] } [15:31:46.223] if (length(args) > 0) [15:31:46.223] base::do.call(base::Sys.setenv, args = args) [15:31:46.223] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:46.223] } [15:31:46.223] else { [15:31:46.223] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:46.223] } [15:31:46.223] { [15:31:46.223] if (base::length(...future.futureOptionsAdded) > [15:31:46.223] 0L) { [15:31:46.223] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:46.223] base::names(opts) <- ...future.futureOptionsAdded [15:31:46.223] base::options(opts) [15:31:46.223] } [15:31:46.223] { [15:31:46.223] { [15:31:46.223] NULL [15:31:46.223] RNGkind("Mersenne-Twister") [15:31:46.223] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:46.223] inherits = FALSE) [15:31:46.223] } [15:31:46.223] options(future.plan = NULL) [15:31:46.223] if (is.na(NA_character_)) [15:31:46.223] Sys.unsetenv("R_FUTURE_PLAN") [15:31:46.223] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:46.223] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:46.223] .init = FALSE) [15:31:46.223] } [15:31:46.223] } [15:31:46.223] } [15:31:46.223] }) [15:31:46.223] if (TRUE) { [15:31:46.223] base::sink(type = "output", split = FALSE) [15:31:46.223] if (TRUE) { [15:31:46.223] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:46.223] } [15:31:46.223] else { [15:31:46.223] ...future.result["stdout"] <- base::list(NULL) [15:31:46.223] } [15:31:46.223] base::close(...future.stdout) [15:31:46.223] ...future.stdout <- NULL [15:31:46.223] } [15:31:46.223] ...future.result$conditions <- ...future.conditions [15:31:46.223] ...future.result$finished <- base::Sys.time() [15:31:46.223] ...future.result [15:31:46.223] } [15:31:46.229] assign_globals() ... [15:31:46.229] List of 5 [15:31:46.229] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:46.229] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:46.229] $ future.call.arguments :List of 2 [15:31:46.229] ..$ collapse: chr "; " [15:31:46.229] ..$ maxHead : int 3 [15:31:46.229] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.229] $ ...future.elements_ii :List of 1 [15:31:46.229] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [15:31:46.229] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [15:31:46.229] $ ...future.seeds_ii : NULL [15:31:46.229] $ ...future.globals.maxSize: NULL [15:31:46.229] - attr(*, "where")=List of 5 [15:31:46.229] ..$ ...future.FUN : [15:31:46.229] ..$ future.call.arguments : [15:31:46.229] ..$ ...future.elements_ii : [15:31:46.229] ..$ ...future.seeds_ii : [15:31:46.229] ..$ ...future.globals.maxSize: [15:31:46.229] - attr(*, "resolved")= logi FALSE [15:31:46.229] - attr(*, "total_size")= num 71456 [15:31:46.229] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.229] - attr(*, "already-done")= logi TRUE [15:31:46.242] - copied '...future.FUN' to environment [15:31:46.243] - copied 'future.call.arguments' to environment [15:31:46.243] - copied '...future.elements_ii' to environment [15:31:46.243] - copied '...future.seeds_ii' to environment [15:31:46.243] - copied '...future.globals.maxSize' to environment [15:31:46.244] assign_globals() ... done [15:31:46.245] plan(): Setting new future strategy stack: [15:31:46.245] List of future strategies: [15:31:46.245] 1. sequential: [15:31:46.245] - args: function (..., envir = parent.frame(), workers = "") [15:31:46.245] - tweaked: FALSE [15:31:46.245] - call: NULL [15:31:46.246] plan(): nbrOfWorkers() = 1 [15:31:46.248] plan(): Setting new future strategy stack: [15:31:46.248] List of future strategies: [15:31:46.248] 1. sequential: [15:31:46.248] - args: function (..., envir = parent.frame(), workers = "") [15:31:46.248] - tweaked: FALSE [15:31:46.248] - call: plan(strategy) [15:31:46.249] plan(): nbrOfWorkers() = 1 [15:31:46.249] SequentialFuture started (and completed) [15:31:46.249] - Launch lazy future ... done [15:31:46.250] run() for 'SequentialFuture' ... done [15:31:46.250] Created future: [15:31:46.250] SequentialFuture: [15:31:46.250] Label: 'future_lapply-1' [15:31:46.250] Expression: [15:31:46.250] { [15:31:46.250] do.call(function(...) { [15:31:46.250] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.250] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:46.250] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.250] on.exit(options(oopts), add = TRUE) [15:31:46.250] } [15:31:46.250] { [15:31:46.250] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:46.250] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.250] ...future.FUN(...future.X_jj, ...) [15:31:46.250] }) [15:31:46.250] } [15:31:46.250] }, args = future.call.arguments) [15:31:46.250] } [15:31:46.250] Lazy evaluation: FALSE [15:31:46.250] Asynchronous evaluation: FALSE [15:31:46.250] Local evaluation: TRUE [15:31:46.250] Environment: R_GlobalEnv [15:31:46.250] Capture standard output: TRUE [15:31:46.250] Capture condition classes: 'condition' (excluding 'nothing') [15:31:46.250] Globals: 5 objects totaling 82.61 KiB (function '...future.FUN' of 69.62 KiB, DotDotDotList 'future.call.arguments' of 168 bytes, list '...future.elements_ii' of 12.83 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:46.250] Packages: 1 packages ('future') [15:31:46.250] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:46.250] Resolved: TRUE [15:31:46.250] Value: 136 bytes of class 'list' [15:31:46.250] Early signaling: FALSE [15:31:46.250] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:46.250] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:46.252] Chunk #1 of 1 ... DONE [15:31:46.252] Launching 1 futures (chunks) ... DONE [15:31:46.253] Resolving 1 futures (chunks) ... [15:31:46.253] resolve() on list ... [15:31:46.253] recursive: 0 [15:31:46.253] length: 1 [15:31:46.254] [15:31:46.254] resolved() for 'SequentialFuture' ... [15:31:46.254] - state: 'finished' [15:31:46.254] - run: TRUE [15:31:46.255] - result: 'FutureResult' [15:31:46.255] resolved() for 'SequentialFuture' ... done [15:31:46.255] Future #1 [15:31:46.255] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:46.256] - nx: 1 [15:31:46.256] - relay: TRUE [15:31:46.256] - stdout: TRUE [15:31:46.256] - signal: TRUE [15:31:46.256] - resignal: FALSE [15:31:46.257] - force: TRUE [15:31:46.257] - relayed: [n=1] FALSE [15:31:46.257] - queued futures: [n=1] FALSE [15:31:46.257] - until=1 [15:31:46.258] - relaying element #1 [15:31:46.258] - relayed: [n=1] TRUE [15:31:46.258] - queued futures: [n=1] TRUE [15:31:46.259] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:46.259] length: 0 (resolved future 1) [15:31:46.259] Relaying remaining futures [15:31:46.259] signalConditionsASAP(NULL, pos=0) ... [15:31:46.259] - nx: 1 [15:31:46.260] - relay: TRUE [15:31:46.260] - stdout: TRUE [15:31:46.260] - signal: TRUE [15:31:46.260] - resignal: FALSE [15:31:46.261] - force: TRUE [15:31:46.261] - relayed: [n=1] TRUE [15:31:46.261] - queued futures: [n=1] TRUE - flush all [15:31:46.261] - relayed: [n=1] TRUE [15:31:46.262] - queued futures: [n=1] TRUE [15:31:46.262] signalConditionsASAP(NULL, pos=0) ... done [15:31:46.262] resolve() on list ... DONE [15:31:46.262] - Number of value chunks collected: 1 [15:31:46.263] Resolving 1 futures (chunks) ... DONE [15:31:46.263] Reducing values from 1 chunks ... [15:31:46.263] - Number of values collected after concatenation: 1 [15:31:46.263] - Number of values expected: 1 [15:31:46.264] Reducing values from 1 chunks ... DONE [15:31:46.264] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [15:31:46.266] future_lapply() ... [15:31:46.267] Number of chunks: 1 [15:31:46.270] getGlobalsAndPackagesXApply() ... [15:31:46.270] - future.globals: TRUE [15:31:46.270] getGlobalsAndPackages() ... [15:31:46.271] Searching for globals... [15:31:46.273] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [15:31:46.274] Searching for globals ... DONE [15:31:46.274] Resolving globals: FALSE [15:31:46.275] The total size of the 1 globals is 4.85 KiB (4968 bytes) [15:31:46.275] The total size of the 1 globals exported for future expression ('FUN()') is 4.85 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (4.85 KiB of class 'function') [15:31:46.276] - globals: [1] 'FUN' [15:31:46.276] - packages: [1] 'listenv' [15:31:46.276] getGlobalsAndPackages() ... DONE [15:31:46.277] - globals found/used: [n=1] 'FUN' [15:31:46.277] - needed namespaces: [n=1] 'listenv' [15:31:46.277] Finding globals ... DONE [15:31:46.278] - use_args: TRUE [15:31:46.278] - Getting '...' globals ... [15:31:46.278] resolve() on list ... [15:31:46.279] recursive: 0 [15:31:46.279] length: 1 [15:31:46.279] elements: '...' [15:31:46.280] length: 0 (resolved future 1) [15:31:46.280] resolve() on list ... DONE [15:31:46.280] - '...' content: [n=0] [15:31:46.280] List of 1 [15:31:46.280] $ ...: list() [15:31:46.280] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.280] - attr(*, "where")=List of 1 [15:31:46.280] ..$ ...: [15:31:46.280] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.280] - attr(*, "resolved")= logi TRUE [15:31:46.280] - attr(*, "total_size")= num NA [15:31:46.285] - Getting '...' globals ... DONE [15:31:46.286] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:46.286] List of 2 [15:31:46.286] $ ...future.FUN:function (x, ...) [15:31:46.286] $ ... : list() [15:31:46.286] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.286] - attr(*, "where")=List of 2 [15:31:46.286] ..$ ...future.FUN: [15:31:46.286] ..$ ... : [15:31:46.286] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.286] - attr(*, "resolved")= logi FALSE [15:31:46.286] - attr(*, "total_size")= num 4968 [15:31:46.291] Packages to be attached in all futures: [n=1] 'listenv' [15:31:46.291] getGlobalsAndPackagesXApply() ... DONE [15:31:46.292] Number of futures (= number of chunks): 1 [15:31:46.292] Launching 1 futures (chunks) ... [15:31:46.292] Chunk #1 of 1 ... [15:31:46.293] - Finding globals in 'X' for chunk #1 ... [15:31:46.293] getGlobalsAndPackages() ... [15:31:46.293] Searching for globals... [15:31:46.294] [15:31:46.294] Searching for globals ... DONE [15:31:46.295] - globals: [0] [15:31:46.295] getGlobalsAndPackages() ... DONE [15:31:46.295] + additional globals found: [n=0] [15:31:46.295] + additional namespaces needed: [n=0] [15:31:46.296] - Finding globals in 'X' for chunk #1 ... DONE [15:31:46.296] - seeds: [15:31:46.296] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.297] getGlobalsAndPackages() ... [15:31:46.297] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.297] Resolving globals: FALSE [15:31:46.297] Tweak future expression to call with '...' arguments ... [15:31:46.298] { [15:31:46.298] do.call(function(...) { [15:31:46.298] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.298] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:46.298] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.298] on.exit(options(oopts), add = TRUE) [15:31:46.298] } [15:31:46.298] { [15:31:46.298] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:46.298] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.298] ...future.FUN(...future.X_jj, ...) [15:31:46.298] }) [15:31:46.298] } [15:31:46.298] }, args = future.call.arguments) [15:31:46.298] } [15:31:46.298] Tweak future expression to call with '...' arguments ... DONE [15:31:46.299] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.300] - packages: [1] 'listenv' [15:31:46.300] getGlobalsAndPackages() ... DONE [15:31:46.301] run() for 'Future' ... [15:31:46.301] - state: 'created' [15:31:46.301] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:46.302] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:46.302] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:46.302] - Field: 'label' [15:31:46.303] - Field: 'local' [15:31:46.303] - Field: 'owner' [15:31:46.303] - Field: 'envir' [15:31:46.304] - Field: 'packages' [15:31:46.304] - Field: 'gc' [15:31:46.304] - Field: 'conditions' [15:31:46.304] - Field: 'expr' [15:31:46.305] - Field: 'uuid' [15:31:46.305] - Field: 'seed' [15:31:46.305] - Field: 'version' [15:31:46.306] - Field: 'result' [15:31:46.306] - Field: 'asynchronous' [15:31:46.306] - Field: 'calls' [15:31:46.306] - Field: 'globals' [15:31:46.307] - Field: 'stdout' [15:31:46.310] - Field: 'earlySignal' [15:31:46.310] - Field: 'lazy' [15:31:46.310] - Field: 'state' [15:31:46.311] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:46.311] - Launch lazy future ... [15:31:46.312] Packages needed by the future expression (n = 1): 'listenv' [15:31:46.312] Packages needed by future strategies (n = 0): [15:31:46.313] { [15:31:46.313] { [15:31:46.313] { [15:31:46.313] ...future.startTime <- base::Sys.time() [15:31:46.313] { [15:31:46.313] { [15:31:46.313] { [15:31:46.313] { [15:31:46.313] base::local({ [15:31:46.313] has_future <- base::requireNamespace("future", [15:31:46.313] quietly = TRUE) [15:31:46.313] if (has_future) { [15:31:46.313] ns <- base::getNamespace("future") [15:31:46.313] version <- ns[[".package"]][["version"]] [15:31:46.313] if (is.null(version)) [15:31:46.313] version <- utils::packageVersion("future") [15:31:46.313] } [15:31:46.313] else { [15:31:46.313] version <- NULL [15:31:46.313] } [15:31:46.313] if (!has_future || version < "1.8.0") { [15:31:46.313] info <- base::c(r_version = base::gsub("R version ", [15:31:46.313] "", base::R.version$version.string), [15:31:46.313] platform = base::sprintf("%s (%s-bit)", [15:31:46.313] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:46.313] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:46.313] "release", "version")], collapse = " "), [15:31:46.313] hostname = base::Sys.info()[["nodename"]]) [15:31:46.313] info <- base::sprintf("%s: %s", base::names(info), [15:31:46.313] info) [15:31:46.313] info <- base::paste(info, collapse = "; ") [15:31:46.313] if (!has_future) { [15:31:46.313] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:46.313] info) [15:31:46.313] } [15:31:46.313] else { [15:31:46.313] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:46.313] info, version) [15:31:46.313] } [15:31:46.313] base::stop(msg) [15:31:46.313] } [15:31:46.313] }) [15:31:46.313] } [15:31:46.313] base::local({ [15:31:46.313] for (pkg in "listenv") { [15:31:46.313] base::loadNamespace(pkg) [15:31:46.313] base::library(pkg, character.only = TRUE) [15:31:46.313] } [15:31:46.313] }) [15:31:46.313] } [15:31:46.313] ...future.strategy.old <- future::plan("list") [15:31:46.313] options(future.plan = NULL) [15:31:46.313] Sys.unsetenv("R_FUTURE_PLAN") [15:31:46.313] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:46.313] } [15:31:46.313] ...future.workdir <- getwd() [15:31:46.313] } [15:31:46.313] ...future.oldOptions <- base::as.list(base::.Options) [15:31:46.313] ...future.oldEnvVars <- base::Sys.getenv() [15:31:46.313] } [15:31:46.313] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:46.313] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:46.313] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:46.313] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:46.313] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:46.313] future.stdout.windows.reencode = NULL, width = 80L) [15:31:46.313] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:46.313] base::names(...future.oldOptions)) [15:31:46.313] } [15:31:46.313] if (FALSE) { [15:31:46.313] } [15:31:46.313] else { [15:31:46.313] if (TRUE) { [15:31:46.313] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:46.313] open = "w") [15:31:46.313] } [15:31:46.313] else { [15:31:46.313] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:46.313] windows = "NUL", "/dev/null"), open = "w") [15:31:46.313] } [15:31:46.313] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:46.313] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:46.313] base::sink(type = "output", split = FALSE) [15:31:46.313] base::close(...future.stdout) [15:31:46.313] }, add = TRUE) [15:31:46.313] } [15:31:46.313] ...future.frame <- base::sys.nframe() [15:31:46.313] ...future.conditions <- base::list() [15:31:46.313] ...future.rng <- base::globalenv()$.Random.seed [15:31:46.313] if (FALSE) { [15:31:46.313] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:46.313] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:46.313] } [15:31:46.313] ...future.result <- base::tryCatch({ [15:31:46.313] base::withCallingHandlers({ [15:31:46.313] ...future.value <- base::withVisible(base::local({ [15:31:46.313] do.call(function(...) { [15:31:46.313] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.313] if (!identical(...future.globals.maxSize.org, [15:31:46.313] ...future.globals.maxSize)) { [15:31:46.313] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.313] on.exit(options(oopts), add = TRUE) [15:31:46.313] } [15:31:46.313] { [15:31:46.313] lapply(seq_along(...future.elements_ii), [15:31:46.313] FUN = function(jj) { [15:31:46.313] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.313] ...future.FUN(...future.X_jj, ...) [15:31:46.313] }) [15:31:46.313] } [15:31:46.313] }, args = future.call.arguments) [15:31:46.313] })) [15:31:46.313] future::FutureResult(value = ...future.value$value, [15:31:46.313] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:46.313] ...future.rng), globalenv = if (FALSE) [15:31:46.313] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:46.313] ...future.globalenv.names)) [15:31:46.313] else NULL, started = ...future.startTime, version = "1.8") [15:31:46.313] }, condition = base::local({ [15:31:46.313] c <- base::c [15:31:46.313] inherits <- base::inherits [15:31:46.313] invokeRestart <- base::invokeRestart [15:31:46.313] length <- base::length [15:31:46.313] list <- base::list [15:31:46.313] seq.int <- base::seq.int [15:31:46.313] signalCondition <- base::signalCondition [15:31:46.313] sys.calls <- base::sys.calls [15:31:46.313] `[[` <- base::`[[` [15:31:46.313] `+` <- base::`+` [15:31:46.313] `<<-` <- base::`<<-` [15:31:46.313] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:46.313] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:46.313] 3L)] [15:31:46.313] } [15:31:46.313] function(cond) { [15:31:46.313] is_error <- inherits(cond, "error") [15:31:46.313] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:46.313] NULL) [15:31:46.313] if (is_error) { [15:31:46.313] sessionInformation <- function() { [15:31:46.313] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:46.313] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:46.313] search = base::search(), system = base::Sys.info()) [15:31:46.313] } [15:31:46.313] ...future.conditions[[length(...future.conditions) + [15:31:46.313] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:46.313] cond$call), session = sessionInformation(), [15:31:46.313] timestamp = base::Sys.time(), signaled = 0L) [15:31:46.313] signalCondition(cond) [15:31:46.313] } [15:31:46.313] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:46.313] "immediateCondition"))) { [15:31:46.313] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:46.313] ...future.conditions[[length(...future.conditions) + [15:31:46.313] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:46.313] if (TRUE && !signal) { [15:31:46.313] muffleCondition <- function (cond, pattern = "^muffle") [15:31:46.313] { [15:31:46.313] inherits <- base::inherits [15:31:46.313] invokeRestart <- base::invokeRestart [15:31:46.313] is.null <- base::is.null [15:31:46.313] muffled <- FALSE [15:31:46.313] if (inherits(cond, "message")) { [15:31:46.313] muffled <- grepl(pattern, "muffleMessage") [15:31:46.313] if (muffled) [15:31:46.313] invokeRestart("muffleMessage") [15:31:46.313] } [15:31:46.313] else if (inherits(cond, "warning")) { [15:31:46.313] muffled <- grepl(pattern, "muffleWarning") [15:31:46.313] if (muffled) [15:31:46.313] invokeRestart("muffleWarning") [15:31:46.313] } [15:31:46.313] else if (inherits(cond, "condition")) { [15:31:46.313] if (!is.null(pattern)) { [15:31:46.313] computeRestarts <- base::computeRestarts [15:31:46.313] grepl <- base::grepl [15:31:46.313] restarts <- computeRestarts(cond) [15:31:46.313] for (restart in restarts) { [15:31:46.313] name <- restart$name [15:31:46.313] if (is.null(name)) [15:31:46.313] next [15:31:46.313] if (!grepl(pattern, name)) [15:31:46.313] next [15:31:46.313] invokeRestart(restart) [15:31:46.313] muffled <- TRUE [15:31:46.313] break [15:31:46.313] } [15:31:46.313] } [15:31:46.313] } [15:31:46.313] invisible(muffled) [15:31:46.313] } [15:31:46.313] muffleCondition(cond, pattern = "^muffle") [15:31:46.313] } [15:31:46.313] } [15:31:46.313] else { [15:31:46.313] if (TRUE) { [15:31:46.313] muffleCondition <- function (cond, pattern = "^muffle") [15:31:46.313] { [15:31:46.313] inherits <- base::inherits [15:31:46.313] invokeRestart <- base::invokeRestart [15:31:46.313] is.null <- base::is.null [15:31:46.313] muffled <- FALSE [15:31:46.313] if (inherits(cond, "message")) { [15:31:46.313] muffled <- grepl(pattern, "muffleMessage") [15:31:46.313] if (muffled) [15:31:46.313] invokeRestart("muffleMessage") [15:31:46.313] } [15:31:46.313] else if (inherits(cond, "warning")) { [15:31:46.313] muffled <- grepl(pattern, "muffleWarning") [15:31:46.313] if (muffled) [15:31:46.313] invokeRestart("muffleWarning") [15:31:46.313] } [15:31:46.313] else if (inherits(cond, "condition")) { [15:31:46.313] if (!is.null(pattern)) { [15:31:46.313] computeRestarts <- base::computeRestarts [15:31:46.313] grepl <- base::grepl [15:31:46.313] restarts <- computeRestarts(cond) [15:31:46.313] for (restart in restarts) { [15:31:46.313] name <- restart$name [15:31:46.313] if (is.null(name)) [15:31:46.313] next [15:31:46.313] if (!grepl(pattern, name)) [15:31:46.313] next [15:31:46.313] invokeRestart(restart) [15:31:46.313] muffled <- TRUE [15:31:46.313] break [15:31:46.313] } [15:31:46.313] } [15:31:46.313] } [15:31:46.313] invisible(muffled) [15:31:46.313] } [15:31:46.313] muffleCondition(cond, pattern = "^muffle") [15:31:46.313] } [15:31:46.313] } [15:31:46.313] } [15:31:46.313] })) [15:31:46.313] }, error = function(ex) { [15:31:46.313] base::structure(base::list(value = NULL, visible = NULL, [15:31:46.313] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:46.313] ...future.rng), started = ...future.startTime, [15:31:46.313] finished = Sys.time(), session_uuid = NA_character_, [15:31:46.313] version = "1.8"), class = "FutureResult") [15:31:46.313] }, finally = { [15:31:46.313] if (!identical(...future.workdir, getwd())) [15:31:46.313] setwd(...future.workdir) [15:31:46.313] { [15:31:46.313] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:46.313] ...future.oldOptions$nwarnings <- NULL [15:31:46.313] } [15:31:46.313] base::options(...future.oldOptions) [15:31:46.313] if (.Platform$OS.type == "windows") { [15:31:46.313] old_names <- names(...future.oldEnvVars) [15:31:46.313] envs <- base::Sys.getenv() [15:31:46.313] names <- names(envs) [15:31:46.313] common <- intersect(names, old_names) [15:31:46.313] added <- setdiff(names, old_names) [15:31:46.313] removed <- setdiff(old_names, names) [15:31:46.313] changed <- common[...future.oldEnvVars[common] != [15:31:46.313] envs[common]] [15:31:46.313] NAMES <- toupper(changed) [15:31:46.313] args <- list() [15:31:46.313] for (kk in seq_along(NAMES)) { [15:31:46.313] name <- changed[[kk]] [15:31:46.313] NAME <- NAMES[[kk]] [15:31:46.313] if (name != NAME && is.element(NAME, old_names)) [15:31:46.313] next [15:31:46.313] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:46.313] } [15:31:46.313] NAMES <- toupper(added) [15:31:46.313] for (kk in seq_along(NAMES)) { [15:31:46.313] name <- added[[kk]] [15:31:46.313] NAME <- NAMES[[kk]] [15:31:46.313] if (name != NAME && is.element(NAME, old_names)) [15:31:46.313] next [15:31:46.313] args[[name]] <- "" [15:31:46.313] } [15:31:46.313] NAMES <- toupper(removed) [15:31:46.313] for (kk in seq_along(NAMES)) { [15:31:46.313] name <- removed[[kk]] [15:31:46.313] NAME <- NAMES[[kk]] [15:31:46.313] if (name != NAME && is.element(NAME, old_names)) [15:31:46.313] next [15:31:46.313] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:46.313] } [15:31:46.313] if (length(args) > 0) [15:31:46.313] base::do.call(base::Sys.setenv, args = args) [15:31:46.313] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:46.313] } [15:31:46.313] else { [15:31:46.313] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:46.313] } [15:31:46.313] { [15:31:46.313] if (base::length(...future.futureOptionsAdded) > [15:31:46.313] 0L) { [15:31:46.313] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:46.313] base::names(opts) <- ...future.futureOptionsAdded [15:31:46.313] base::options(opts) [15:31:46.313] } [15:31:46.313] { [15:31:46.313] { [15:31:46.313] NULL [15:31:46.313] RNGkind("Mersenne-Twister") [15:31:46.313] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:46.313] inherits = FALSE) [15:31:46.313] } [15:31:46.313] options(future.plan = NULL) [15:31:46.313] if (is.na(NA_character_)) [15:31:46.313] Sys.unsetenv("R_FUTURE_PLAN") [15:31:46.313] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:46.313] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:46.313] .init = FALSE) [15:31:46.313] } [15:31:46.313] } [15:31:46.313] } [15:31:46.313] }) [15:31:46.313] if (TRUE) { [15:31:46.313] base::sink(type = "output", split = FALSE) [15:31:46.313] if (TRUE) { [15:31:46.313] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:46.313] } [15:31:46.313] else { [15:31:46.313] ...future.result["stdout"] <- base::list(NULL) [15:31:46.313] } [15:31:46.313] base::close(...future.stdout) [15:31:46.313] ...future.stdout <- NULL [15:31:46.313] } [15:31:46.313] ...future.result$conditions <- ...future.conditions [15:31:46.313] ...future.result$finished <- base::Sys.time() [15:31:46.313] ...future.result [15:31:46.313] } [15:31:46.320] assign_globals() ... [15:31:46.320] List of 5 [15:31:46.320] $ ...future.FUN :function (x, ...) [15:31:46.320] $ future.call.arguments : list() [15:31:46.320] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.320] $ ...future.elements_ii :List of 2 [15:31:46.320] ..$ a:Classes 'listenv', 'environment' [15:31:46.320] ..$ b:Classes 'listenv', 'environment' [15:31:46.320] $ ...future.seeds_ii : NULL [15:31:46.320] $ ...future.globals.maxSize: NULL [15:31:46.320] - attr(*, "where")=List of 5 [15:31:46.320] ..$ ...future.FUN : [15:31:46.320] ..$ future.call.arguments : [15:31:46.320] ..$ ...future.elements_ii : [15:31:46.320] ..$ ...future.seeds_ii : [15:31:46.320] ..$ ...future.globals.maxSize: [15:31:46.320] - attr(*, "resolved")= logi FALSE [15:31:46.320] - attr(*, "total_size")= num 4968 [15:31:46.320] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.320] - attr(*, "already-done")= logi TRUE [15:31:46.330] - copied '...future.FUN' to environment [15:31:46.330] - copied 'future.call.arguments' to environment [15:31:46.330] - copied '...future.elements_ii' to environment [15:31:46.331] - copied '...future.seeds_ii' to environment [15:31:46.331] - copied '...future.globals.maxSize' to environment [15:31:46.331] assign_globals() ... done [15:31:46.332] plan(): Setting new future strategy stack: [15:31:46.332] List of future strategies: [15:31:46.332] 1. sequential: [15:31:46.332] - args: function (..., envir = parent.frame(), workers = "") [15:31:46.332] - tweaked: FALSE [15:31:46.332] - call: NULL [15:31:46.333] plan(): nbrOfWorkers() = 1 [15:31:46.335] plan(): Setting new future strategy stack: [15:31:46.336] List of future strategies: [15:31:46.336] 1. sequential: [15:31:46.336] - args: function (..., envir = parent.frame(), workers = "") [15:31:46.336] - tweaked: FALSE [15:31:46.336] - call: plan(strategy) [15:31:46.337] plan(): nbrOfWorkers() = 1 [15:31:46.337] SequentialFuture started (and completed) [15:31:46.337] - Launch lazy future ... done [15:31:46.338] run() for 'SequentialFuture' ... done [15:31:46.338] Created future: [15:31:46.338] SequentialFuture: [15:31:46.338] Label: 'future_lapply-1' [15:31:46.338] Expression: [15:31:46.338] { [15:31:46.338] do.call(function(...) { [15:31:46.338] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.338] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:46.338] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.338] on.exit(options(oopts), add = TRUE) [15:31:46.338] } [15:31:46.338] { [15:31:46.338] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:46.338] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.338] ...future.FUN(...future.X_jj, ...) [15:31:46.338] }) [15:31:46.338] } [15:31:46.338] }, args = future.call.arguments) [15:31:46.338] } [15:31:46.338] Lazy evaluation: FALSE [15:31:46.338] Asynchronous evaluation: FALSE [15:31:46.338] Local evaluation: TRUE [15:31:46.338] Environment: R_GlobalEnv [15:31:46.338] Capture standard output: TRUE [15:31:46.338] Capture condition classes: 'condition' (excluding 'nothing') [15:31:46.338] Globals: 5 objects totaling 17.90 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 13.05 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:46.338] Packages: 1 packages ('listenv') [15:31:46.338] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:46.338] Resolved: TRUE [15:31:46.338] Value: 800 bytes of class 'list' [15:31:46.338] Early signaling: FALSE [15:31:46.338] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:46.338] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:46.340] Chunk #1 of 1 ... DONE [15:31:46.341] Launching 1 futures (chunks) ... DONE [15:31:46.341] Resolving 1 futures (chunks) ... [15:31:46.341] resolve() on list ... [15:31:46.341] recursive: 0 [15:31:46.342] length: 1 [15:31:46.342] [15:31:46.342] resolved() for 'SequentialFuture' ... [15:31:46.343] - state: 'finished' [15:31:46.343] - run: TRUE [15:31:46.343] - result: 'FutureResult' [15:31:46.343] resolved() for 'SequentialFuture' ... done [15:31:46.344] Future #1 [15:31:46.344] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:46.344] - nx: 1 [15:31:46.345] - relay: TRUE [15:31:46.345] - stdout: TRUE [15:31:46.345] - signal: TRUE [15:31:46.345] - resignal: FALSE [15:31:46.346] - force: TRUE [15:31:46.346] - relayed: [n=1] FALSE [15:31:46.346] - queued futures: [n=1] FALSE [15:31:46.346] - until=1 [15:31:46.347] - relaying element #1 [15:31:46.347] - relayed: [n=1] TRUE [15:31:46.347] - queued futures: [n=1] TRUE [15:31:46.348] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:46.348] length: 0 (resolved future 1) [15:31:46.348] Relaying remaining futures [15:31:46.348] signalConditionsASAP(NULL, pos=0) ... [15:31:46.349] - nx: 1 [15:31:46.349] - relay: TRUE [15:31:46.349] - stdout: TRUE [15:31:46.349] - signal: TRUE [15:31:46.350] - resignal: FALSE [15:31:46.350] - force: TRUE [15:31:46.350] - relayed: [n=1] TRUE [15:31:46.350] - queued futures: [n=1] TRUE - flush all [15:31:46.351] - relayed: [n=1] TRUE [15:31:46.351] - queued futures: [n=1] TRUE [15:31:46.351] signalConditionsASAP(NULL, pos=0) ... done [15:31:46.351] resolve() on list ... DONE [15:31:46.352] - Number of value chunks collected: 1 [15:31:46.352] Resolving 1 futures (chunks) ... DONE [15:31:46.352] Reducing values from 1 chunks ... [15:31:46.353] - Number of values collected after concatenation: 2 [15:31:46.353] - Number of values expected: 2 [15:31:46.353] Reducing values from 1 chunks ... DONE [15:31:46.353] 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, ...) ... [15:31:46.360] future_lapply() ... [15:31:46.361] Number of chunks: 1 [15:31:46.362] Index remapping (attribute 'ordering'): [n = 4] 2, 4, 3, 1 [15:31:46.362] getGlobalsAndPackagesXApply() ... [15:31:46.362] - future.globals: TRUE [15:31:46.362] getGlobalsAndPackages() ... [15:31:46.363] Searching for globals... [15:31:46.365] - globals found: [2] 'FUN', '.Internal' [15:31:46.365] Searching for globals ... DONE [15:31:46.365] Resolving globals: FALSE [15:31:46.366] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:46.367] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:46.367] - globals: [1] 'FUN' [15:31:46.367] [15:31:46.367] getGlobalsAndPackages() ... DONE [15:31:46.368] - globals found/used: [n=1] 'FUN' [15:31:46.368] - needed namespaces: [n=0] [15:31:46.368] Finding globals ... DONE [15:31:46.368] - use_args: TRUE [15:31:46.369] - Getting '...' globals ... [15:31:46.369] resolve() on list ... [15:31:46.369] recursive: 0 [15:31:46.370] length: 1 [15:31:46.370] elements: '...' [15:31:46.370] length: 0 (resolved future 1) [15:31:46.370] resolve() on list ... DONE [15:31:46.371] - '...' content: [n=1] 'length' [15:31:46.371] List of 1 [15:31:46.371] $ ...:List of 1 [15:31:46.371] ..$ length: int 2 [15:31:46.371] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.371] - attr(*, "where")=List of 1 [15:31:46.371] ..$ ...: [15:31:46.371] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.371] - attr(*, "resolved")= logi TRUE [15:31:46.371] - attr(*, "total_size")= num NA [15:31:46.377] - Getting '...' globals ... DONE [15:31:46.377] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:46.377] List of 2 [15:31:46.377] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:46.377] $ ... :List of 1 [15:31:46.377] ..$ length: int 2 [15:31:46.377] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.377] - attr(*, "where")=List of 2 [15:31:46.377] ..$ ...future.FUN: [15:31:46.377] ..$ ... : [15:31:46.377] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.377] - attr(*, "resolved")= logi FALSE [15:31:46.377] - attr(*, "total_size")= num 2240 [15:31:46.383] Packages to be attached in all futures: [n=0] [15:31:46.383] getGlobalsAndPackagesXApply() ... DONE [15:31:46.383] Number of futures (= number of chunks): 1 [15:31:46.384] Launching 1 futures (chunks) ... [15:31:46.384] Chunk #1 of 1 ... [15:31:46.384] - Finding globals in 'X' for chunk #1 ... [15:31:46.384] getGlobalsAndPackages() ... [15:31:46.385] Searching for globals... [15:31:46.385] [15:31:46.385] Searching for globals ... DONE [15:31:46.386] - globals: [0] [15:31:46.386] getGlobalsAndPackages() ... DONE [15:31:46.386] + additional globals found: [n=0] [15:31:46.386] + additional namespaces needed: [n=0] [15:31:46.386] - Finding globals in 'X' for chunk #1 ... DONE [15:31:46.387] - seeds: [15:31:46.387] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.387] getGlobalsAndPackages() ... [15:31:46.387] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.388] Resolving globals: FALSE [15:31:46.388] Tweak future expression to call with '...' arguments ... [15:31:46.388] { [15:31:46.388] do.call(function(...) { [15:31:46.388] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.388] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:46.388] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.388] on.exit(options(oopts), add = TRUE) [15:31:46.388] } [15:31:46.388] { [15:31:46.388] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:46.388] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.388] ...future.FUN(...future.X_jj, ...) [15:31:46.388] }) [15:31:46.388] } [15:31:46.388] }, args = future.call.arguments) [15:31:46.388] } [15:31:46.389] Tweak future expression to call with '...' arguments ... DONE [15:31:46.392] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.392] [15:31:46.392] getGlobalsAndPackages() ... DONE [15:31:46.393] run() for 'Future' ... [15:31:46.393] - state: 'created' [15:31:46.394] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:46.394] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:46.395] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:46.395] - Field: 'label' [15:31:46.395] - Field: 'local' [15:31:46.396] - Field: 'owner' [15:31:46.396] - Field: 'envir' [15:31:46.396] - Field: 'packages' [15:31:46.396] - Field: 'gc' [15:31:46.397] - Field: 'conditions' [15:31:46.397] - Field: 'expr' [15:31:46.397] - Field: 'uuid' [15:31:46.397] - Field: 'seed' [15:31:46.398] - Field: 'version' [15:31:46.398] - Field: 'result' [15:31:46.398] - Field: 'asynchronous' [15:31:46.399] - Field: 'calls' [15:31:46.399] - Field: 'globals' [15:31:46.399] - Field: 'stdout' [15:31:46.399] - Field: 'earlySignal' [15:31:46.400] - Field: 'lazy' [15:31:46.400] - Field: 'state' [15:31:46.400] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:46.400] - Launch lazy future ... [15:31:46.401] Packages needed by the future expression (n = 0): [15:31:46.401] Packages needed by future strategies (n = 0): [15:31:46.402] { [15:31:46.402] { [15:31:46.402] { [15:31:46.402] ...future.startTime <- base::Sys.time() [15:31:46.402] { [15:31:46.402] { [15:31:46.402] { [15:31:46.402] base::local({ [15:31:46.402] has_future <- base::requireNamespace("future", [15:31:46.402] quietly = TRUE) [15:31:46.402] if (has_future) { [15:31:46.402] ns <- base::getNamespace("future") [15:31:46.402] version <- ns[[".package"]][["version"]] [15:31:46.402] if (is.null(version)) [15:31:46.402] version <- utils::packageVersion("future") [15:31:46.402] } [15:31:46.402] else { [15:31:46.402] version <- NULL [15:31:46.402] } [15:31:46.402] if (!has_future || version < "1.8.0") { [15:31:46.402] info <- base::c(r_version = base::gsub("R version ", [15:31:46.402] "", base::R.version$version.string), [15:31:46.402] platform = base::sprintf("%s (%s-bit)", [15:31:46.402] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:46.402] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:46.402] "release", "version")], collapse = " "), [15:31:46.402] hostname = base::Sys.info()[["nodename"]]) [15:31:46.402] info <- base::sprintf("%s: %s", base::names(info), [15:31:46.402] info) [15:31:46.402] info <- base::paste(info, collapse = "; ") [15:31:46.402] if (!has_future) { [15:31:46.402] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:46.402] info) [15:31:46.402] } [15:31:46.402] else { [15:31:46.402] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:46.402] info, version) [15:31:46.402] } [15:31:46.402] base::stop(msg) [15:31:46.402] } [15:31:46.402] }) [15:31:46.402] } [15:31:46.402] ...future.strategy.old <- future::plan("list") [15:31:46.402] options(future.plan = NULL) [15:31:46.402] Sys.unsetenv("R_FUTURE_PLAN") [15:31:46.402] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:46.402] } [15:31:46.402] ...future.workdir <- getwd() [15:31:46.402] } [15:31:46.402] ...future.oldOptions <- base::as.list(base::.Options) [15:31:46.402] ...future.oldEnvVars <- base::Sys.getenv() [15:31:46.402] } [15:31:46.402] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:46.402] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:46.402] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:46.402] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:46.402] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:46.402] future.stdout.windows.reencode = NULL, width = 80L) [15:31:46.402] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:46.402] base::names(...future.oldOptions)) [15:31:46.402] } [15:31:46.402] if (FALSE) { [15:31:46.402] } [15:31:46.402] else { [15:31:46.402] if (TRUE) { [15:31:46.402] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:46.402] open = "w") [15:31:46.402] } [15:31:46.402] else { [15:31:46.402] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:46.402] windows = "NUL", "/dev/null"), open = "w") [15:31:46.402] } [15:31:46.402] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:46.402] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:46.402] base::sink(type = "output", split = FALSE) [15:31:46.402] base::close(...future.stdout) [15:31:46.402] }, add = TRUE) [15:31:46.402] } [15:31:46.402] ...future.frame <- base::sys.nframe() [15:31:46.402] ...future.conditions <- base::list() [15:31:46.402] ...future.rng <- base::globalenv()$.Random.seed [15:31:46.402] if (FALSE) { [15:31:46.402] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:46.402] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:46.402] } [15:31:46.402] ...future.result <- base::tryCatch({ [15:31:46.402] base::withCallingHandlers({ [15:31:46.402] ...future.value <- base::withVisible(base::local({ [15:31:46.402] do.call(function(...) { [15:31:46.402] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.402] if (!identical(...future.globals.maxSize.org, [15:31:46.402] ...future.globals.maxSize)) { [15:31:46.402] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.402] on.exit(options(oopts), add = TRUE) [15:31:46.402] } [15:31:46.402] { [15:31:46.402] lapply(seq_along(...future.elements_ii), [15:31:46.402] FUN = function(jj) { [15:31:46.402] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.402] ...future.FUN(...future.X_jj, ...) [15:31:46.402] }) [15:31:46.402] } [15:31:46.402] }, args = future.call.arguments) [15:31:46.402] })) [15:31:46.402] future::FutureResult(value = ...future.value$value, [15:31:46.402] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:46.402] ...future.rng), globalenv = if (FALSE) [15:31:46.402] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:46.402] ...future.globalenv.names)) [15:31:46.402] else NULL, started = ...future.startTime, version = "1.8") [15:31:46.402] }, condition = base::local({ [15:31:46.402] c <- base::c [15:31:46.402] inherits <- base::inherits [15:31:46.402] invokeRestart <- base::invokeRestart [15:31:46.402] length <- base::length [15:31:46.402] list <- base::list [15:31:46.402] seq.int <- base::seq.int [15:31:46.402] signalCondition <- base::signalCondition [15:31:46.402] sys.calls <- base::sys.calls [15:31:46.402] `[[` <- base::`[[` [15:31:46.402] `+` <- base::`+` [15:31:46.402] `<<-` <- base::`<<-` [15:31:46.402] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:46.402] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:46.402] 3L)] [15:31:46.402] } [15:31:46.402] function(cond) { [15:31:46.402] is_error <- inherits(cond, "error") [15:31:46.402] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:46.402] NULL) [15:31:46.402] if (is_error) { [15:31:46.402] sessionInformation <- function() { [15:31:46.402] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:46.402] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:46.402] search = base::search(), system = base::Sys.info()) [15:31:46.402] } [15:31:46.402] ...future.conditions[[length(...future.conditions) + [15:31:46.402] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:46.402] cond$call), session = sessionInformation(), [15:31:46.402] timestamp = base::Sys.time(), signaled = 0L) [15:31:46.402] signalCondition(cond) [15:31:46.402] } [15:31:46.402] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:46.402] "immediateCondition"))) { [15:31:46.402] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:46.402] ...future.conditions[[length(...future.conditions) + [15:31:46.402] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:46.402] if (TRUE && !signal) { [15:31:46.402] muffleCondition <- function (cond, pattern = "^muffle") [15:31:46.402] { [15:31:46.402] inherits <- base::inherits [15:31:46.402] invokeRestart <- base::invokeRestart [15:31:46.402] is.null <- base::is.null [15:31:46.402] muffled <- FALSE [15:31:46.402] if (inherits(cond, "message")) { [15:31:46.402] muffled <- grepl(pattern, "muffleMessage") [15:31:46.402] if (muffled) [15:31:46.402] invokeRestart("muffleMessage") [15:31:46.402] } [15:31:46.402] else if (inherits(cond, "warning")) { [15:31:46.402] muffled <- grepl(pattern, "muffleWarning") [15:31:46.402] if (muffled) [15:31:46.402] invokeRestart("muffleWarning") [15:31:46.402] } [15:31:46.402] else if (inherits(cond, "condition")) { [15:31:46.402] if (!is.null(pattern)) { [15:31:46.402] computeRestarts <- base::computeRestarts [15:31:46.402] grepl <- base::grepl [15:31:46.402] restarts <- computeRestarts(cond) [15:31:46.402] for (restart in restarts) { [15:31:46.402] name <- restart$name [15:31:46.402] if (is.null(name)) [15:31:46.402] next [15:31:46.402] if (!grepl(pattern, name)) [15:31:46.402] next [15:31:46.402] invokeRestart(restart) [15:31:46.402] muffled <- TRUE [15:31:46.402] break [15:31:46.402] } [15:31:46.402] } [15:31:46.402] } [15:31:46.402] invisible(muffled) [15:31:46.402] } [15:31:46.402] muffleCondition(cond, pattern = "^muffle") [15:31:46.402] } [15:31:46.402] } [15:31:46.402] else { [15:31:46.402] if (TRUE) { [15:31:46.402] muffleCondition <- function (cond, pattern = "^muffle") [15:31:46.402] { [15:31:46.402] inherits <- base::inherits [15:31:46.402] invokeRestart <- base::invokeRestart [15:31:46.402] is.null <- base::is.null [15:31:46.402] muffled <- FALSE [15:31:46.402] if (inherits(cond, "message")) { [15:31:46.402] muffled <- grepl(pattern, "muffleMessage") [15:31:46.402] if (muffled) [15:31:46.402] invokeRestart("muffleMessage") [15:31:46.402] } [15:31:46.402] else if (inherits(cond, "warning")) { [15:31:46.402] muffled <- grepl(pattern, "muffleWarning") [15:31:46.402] if (muffled) [15:31:46.402] invokeRestart("muffleWarning") [15:31:46.402] } [15:31:46.402] else if (inherits(cond, "condition")) { [15:31:46.402] if (!is.null(pattern)) { [15:31:46.402] computeRestarts <- base::computeRestarts [15:31:46.402] grepl <- base::grepl [15:31:46.402] restarts <- computeRestarts(cond) [15:31:46.402] for (restart in restarts) { [15:31:46.402] name <- restart$name [15:31:46.402] if (is.null(name)) [15:31:46.402] next [15:31:46.402] if (!grepl(pattern, name)) [15:31:46.402] next [15:31:46.402] invokeRestart(restart) [15:31:46.402] muffled <- TRUE [15:31:46.402] break [15:31:46.402] } [15:31:46.402] } [15:31:46.402] } [15:31:46.402] invisible(muffled) [15:31:46.402] } [15:31:46.402] muffleCondition(cond, pattern = "^muffle") [15:31:46.402] } [15:31:46.402] } [15:31:46.402] } [15:31:46.402] })) [15:31:46.402] }, error = function(ex) { [15:31:46.402] base::structure(base::list(value = NULL, visible = NULL, [15:31:46.402] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:46.402] ...future.rng), started = ...future.startTime, [15:31:46.402] finished = Sys.time(), session_uuid = NA_character_, [15:31:46.402] version = "1.8"), class = "FutureResult") [15:31:46.402] }, finally = { [15:31:46.402] if (!identical(...future.workdir, getwd())) [15:31:46.402] setwd(...future.workdir) [15:31:46.402] { [15:31:46.402] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:46.402] ...future.oldOptions$nwarnings <- NULL [15:31:46.402] } [15:31:46.402] base::options(...future.oldOptions) [15:31:46.402] if (.Platform$OS.type == "windows") { [15:31:46.402] old_names <- names(...future.oldEnvVars) [15:31:46.402] envs <- base::Sys.getenv() [15:31:46.402] names <- names(envs) [15:31:46.402] common <- intersect(names, old_names) [15:31:46.402] added <- setdiff(names, old_names) [15:31:46.402] removed <- setdiff(old_names, names) [15:31:46.402] changed <- common[...future.oldEnvVars[common] != [15:31:46.402] envs[common]] [15:31:46.402] NAMES <- toupper(changed) [15:31:46.402] args <- list() [15:31:46.402] for (kk in seq_along(NAMES)) { [15:31:46.402] name <- changed[[kk]] [15:31:46.402] NAME <- NAMES[[kk]] [15:31:46.402] if (name != NAME && is.element(NAME, old_names)) [15:31:46.402] next [15:31:46.402] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:46.402] } [15:31:46.402] NAMES <- toupper(added) [15:31:46.402] for (kk in seq_along(NAMES)) { [15:31:46.402] name <- added[[kk]] [15:31:46.402] NAME <- NAMES[[kk]] [15:31:46.402] if (name != NAME && is.element(NAME, old_names)) [15:31:46.402] next [15:31:46.402] args[[name]] <- "" [15:31:46.402] } [15:31:46.402] NAMES <- toupper(removed) [15:31:46.402] for (kk in seq_along(NAMES)) { [15:31:46.402] name <- removed[[kk]] [15:31:46.402] NAME <- NAMES[[kk]] [15:31:46.402] if (name != NAME && is.element(NAME, old_names)) [15:31:46.402] next [15:31:46.402] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:46.402] } [15:31:46.402] if (length(args) > 0) [15:31:46.402] base::do.call(base::Sys.setenv, args = args) [15:31:46.402] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:46.402] } [15:31:46.402] else { [15:31:46.402] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:46.402] } [15:31:46.402] { [15:31:46.402] if (base::length(...future.futureOptionsAdded) > [15:31:46.402] 0L) { [15:31:46.402] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:46.402] base::names(opts) <- ...future.futureOptionsAdded [15:31:46.402] base::options(opts) [15:31:46.402] } [15:31:46.402] { [15:31:46.402] { [15:31:46.402] NULL [15:31:46.402] RNGkind("Mersenne-Twister") [15:31:46.402] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:46.402] inherits = FALSE) [15:31:46.402] } [15:31:46.402] options(future.plan = NULL) [15:31:46.402] if (is.na(NA_character_)) [15:31:46.402] Sys.unsetenv("R_FUTURE_PLAN") [15:31:46.402] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:46.402] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:46.402] .init = FALSE) [15:31:46.402] } [15:31:46.402] } [15:31:46.402] } [15:31:46.402] }) [15:31:46.402] if (TRUE) { [15:31:46.402] base::sink(type = "output", split = FALSE) [15:31:46.402] if (TRUE) { [15:31:46.402] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:46.402] } [15:31:46.402] else { [15:31:46.402] ...future.result["stdout"] <- base::list(NULL) [15:31:46.402] } [15:31:46.402] base::close(...future.stdout) [15:31:46.402] ...future.stdout <- NULL [15:31:46.402] } [15:31:46.402] ...future.result$conditions <- ...future.conditions [15:31:46.402] ...future.result$finished <- base::Sys.time() [15:31:46.402] ...future.result [15:31:46.402] } [15:31:46.407] assign_globals() ... [15:31:46.408] List of 5 [15:31:46.408] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:46.408] $ future.call.arguments :List of 1 [15:31:46.408] ..$ length: int 2 [15:31:46.408] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.408] $ ...future.elements_ii :List of 4 [15:31:46.408] ..$ b: chr "numeric" [15:31:46.408] ..$ c: chr "list" [15:31:46.408] ..$ c: chr "character" [15:31:46.408] ..$ a: chr "integer" [15:31:46.408] $ ...future.seeds_ii : NULL [15:31:46.408] $ ...future.globals.maxSize: NULL [15:31:46.408] - attr(*, "where")=List of 5 [15:31:46.408] ..$ ...future.FUN : [15:31:46.408] ..$ future.call.arguments : [15:31:46.408] ..$ ...future.elements_ii : [15:31:46.408] ..$ ...future.seeds_ii : [15:31:46.408] ..$ ...future.globals.maxSize: [15:31:46.408] - attr(*, "resolved")= logi FALSE [15:31:46.408] - attr(*, "total_size")= num 2240 [15:31:46.408] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.408] - attr(*, "already-done")= logi TRUE [15:31:46.421] - copied '...future.FUN' to environment [15:31:46.421] - copied 'future.call.arguments' to environment [15:31:46.421] - copied '...future.elements_ii' to environment [15:31:46.422] - copied '...future.seeds_ii' to environment [15:31:46.422] - copied '...future.globals.maxSize' to environment [15:31:46.422] assign_globals() ... done [15:31:46.423] plan(): Setting new future strategy stack: [15:31:46.423] List of future strategies: [15:31:46.423] 1. sequential: [15:31:46.423] - args: function (..., envir = parent.frame(), workers = "") [15:31:46.423] - tweaked: FALSE [15:31:46.423] - call: NULL [15:31:46.425] plan(): nbrOfWorkers() = 1 [15:31:46.427] plan(): Setting new future strategy stack: [15:31:46.427] List of future strategies: [15:31:46.427] 1. sequential: [15:31:46.427] - args: function (..., envir = parent.frame(), workers = "") [15:31:46.427] - tweaked: FALSE [15:31:46.427] - call: plan(strategy) [15:31:46.429] plan(): nbrOfWorkers() = 1 [15:31:46.429] SequentialFuture started (and completed) [15:31:46.429] - Launch lazy future ... done [15:31:46.430] run() for 'SequentialFuture' ... done [15:31:46.430] Created future: [15:31:46.431] SequentialFuture: [15:31:46.431] Label: 'future_lapply-1' [15:31:46.431] Expression: [15:31:46.431] { [15:31:46.431] do.call(function(...) { [15:31:46.431] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.431] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:46.431] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.431] on.exit(options(oopts), add = TRUE) [15:31:46.431] } [15:31:46.431] { [15:31:46.431] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:46.431] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.431] ...future.FUN(...future.X_jj, ...) [15:31:46.431] }) [15:31:46.431] } [15:31:46.431] }, args = future.call.arguments) [15:31:46.431] } [15:31:46.431] Lazy evaluation: FALSE [15:31:46.431] Asynchronous evaluation: FALSE [15:31:46.431] Local evaluation: TRUE [15:31:46.431] Environment: R_GlobalEnv [15:31:46.431] Capture standard output: TRUE [15:31:46.431] Capture condition classes: 'condition' (excluding 'nothing') [15:31:46.431] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:46.431] Packages: [15:31:46.431] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:46.431] Resolved: TRUE [15:31:46.431] Value: 240 bytes of class 'list' [15:31:46.431] Early signaling: FALSE [15:31:46.431] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:46.431] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:46.433] Chunk #1 of 1 ... DONE [15:31:46.433] Launching 1 futures (chunks) ... DONE [15:31:46.434] Resolving 1 futures (chunks) ... [15:31:46.434] resolve() on list ... [15:31:46.434] recursive: 0 [15:31:46.435] length: 1 [15:31:46.435] [15:31:46.435] resolved() for 'SequentialFuture' ... [15:31:46.436] - state: 'finished' [15:31:46.436] - run: TRUE [15:31:46.436] - result: 'FutureResult' [15:31:46.437] resolved() for 'SequentialFuture' ... done [15:31:46.437] Future #1 [15:31:46.442] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:46.442] - nx: 1 [15:31:46.443] - relay: TRUE [15:31:46.443] - stdout: TRUE [15:31:46.443] - signal: TRUE [15:31:46.444] - resignal: FALSE [15:31:46.444] - force: TRUE [15:31:46.444] - relayed: [n=1] FALSE [15:31:46.445] - queued futures: [n=1] FALSE [15:31:46.445] - until=1 [15:31:46.445] - relaying element #1 [15:31:46.446] - relayed: [n=1] TRUE [15:31:46.446] - queued futures: [n=1] TRUE [15:31:46.447] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:46.447] length: 0 (resolved future 1) [15:31:46.448] Relaying remaining futures [15:31:46.448] signalConditionsASAP(NULL, pos=0) ... [15:31:46.448] - nx: 1 [15:31:46.448] - relay: TRUE [15:31:46.449] - stdout: TRUE [15:31:46.449] - signal: TRUE [15:31:46.449] - resignal: FALSE [15:31:46.450] - force: TRUE [15:31:46.450] - relayed: [n=1] TRUE [15:31:46.450] - queued futures: [n=1] TRUE - flush all [15:31:46.451] - relayed: [n=1] TRUE [15:31:46.451] - queued futures: [n=1] TRUE [15:31:46.451] signalConditionsASAP(NULL, pos=0) ... done [15:31:46.452] resolve() on list ... DONE [15:31:46.453] - Number of value chunks collected: 1 [15:31:46.453] Resolving 1 futures (chunks) ... DONE [15:31:46.453] Reducing values from 1 chunks ... [15:31:46.454] - Number of values collected after concatenation: 4 [15:31:46.454] - Number of values expected: 4 [15:31:46.455] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 1, 3, 2 [15:31:46.455] Reducing values from 1 chunks ... DONE [15:31:46.455] 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 [15:31:46.461] future_lapply() ... [15:31:46.462] Number of chunks: 1 [15:31:46.463] Index remapping (attribute 'ordering'): [n = 4] 4, 1, 3, 2 [15:31:46.463] getGlobalsAndPackagesXApply() ... [15:31:46.464] - future.globals: TRUE [15:31:46.464] getGlobalsAndPackages() ... [15:31:46.464] Searching for globals... [15:31:46.467] - globals found: [2] 'FUN', '.Internal' [15:31:46.467] Searching for globals ... DONE [15:31:46.468] Resolving globals: FALSE [15:31:46.469] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:46.470] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:46.470] - globals: [1] 'FUN' [15:31:46.470] [15:31:46.471] getGlobalsAndPackages() ... DONE [15:31:46.471] - globals found/used: [n=1] 'FUN' [15:31:46.471] - needed namespaces: [n=0] [15:31:46.472] Finding globals ... DONE [15:31:46.472] - use_args: TRUE [15:31:46.472] - Getting '...' globals ... [15:31:46.473] resolve() on list ... [15:31:46.474] recursive: 0 [15:31:46.474] length: 1 [15:31:46.474] elements: '...' [15:31:46.475] length: 0 (resolved future 1) [15:31:46.475] resolve() on list ... DONE [15:31:46.475] - '...' content: [n=1] 'length' [15:31:46.476] List of 1 [15:31:46.476] $ ...:List of 1 [15:31:46.476] ..$ length: int 2 [15:31:46.476] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.476] - attr(*, "where")=List of 1 [15:31:46.476] ..$ ...: [15:31:46.476] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.476] - attr(*, "resolved")= logi TRUE [15:31:46.476] - attr(*, "total_size")= num NA [15:31:46.483] - Getting '...' globals ... DONE [15:31:46.483] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:46.483] List of 2 [15:31:46.483] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:46.483] $ ... :List of 1 [15:31:46.483] ..$ length: int 2 [15:31:46.483] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.483] - attr(*, "where")=List of 2 [15:31:46.483] ..$ ...future.FUN: [15:31:46.483] ..$ ... : [15:31:46.483] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.483] - attr(*, "resolved")= logi FALSE [15:31:46.483] - attr(*, "total_size")= num 2240 [15:31:46.498] Packages to be attached in all futures: [n=0] [15:31:46.499] getGlobalsAndPackagesXApply() ... DONE [15:31:46.499] Number of futures (= number of chunks): 1 [15:31:46.500] Launching 1 futures (chunks) ... [15:31:46.500] Chunk #1 of 1 ... [15:31:46.501] - Finding globals in 'X' for chunk #1 ... [15:31:46.501] getGlobalsAndPackages() ... [15:31:46.502] Searching for globals... [15:31:46.502] [15:31:46.503] Searching for globals ... DONE [15:31:46.503] - globals: [0] [15:31:46.504] getGlobalsAndPackages() ... DONE [15:31:46.504] + additional globals found: [n=0] [15:31:46.504] + additional namespaces needed: [n=0] [15:31:46.505] - Finding globals in 'X' for chunk #1 ... DONE [15:31:46.505] - seeds: [15:31:46.505] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.506] getGlobalsAndPackages() ... [15:31:46.506] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.506] Resolving globals: FALSE [15:31:46.507] Tweak future expression to call with '...' arguments ... [15:31:46.507] { [15:31:46.507] do.call(function(...) { [15:31:46.507] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.507] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:46.507] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.507] on.exit(options(oopts), add = TRUE) [15:31:46.507] } [15:31:46.507] { [15:31:46.507] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:46.507] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.507] ...future.FUN(...future.X_jj, ...) [15:31:46.507] }) [15:31:46.507] } [15:31:46.507] }, args = future.call.arguments) [15:31:46.507] } [15:31:46.508] Tweak future expression to call with '...' arguments ... DONE [15:31:46.509] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.509] [15:31:46.510] getGlobalsAndPackages() ... DONE [15:31:46.510] run() for 'Future' ... [15:31:46.511] - state: 'created' [15:31:46.511] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:46.512] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:46.513] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:46.513] - Field: 'label' [15:31:46.513] - Field: 'local' [15:31:46.514] - Field: 'owner' [15:31:46.514] - Field: 'envir' [15:31:46.514] - Field: 'packages' [15:31:46.515] - Field: 'gc' [15:31:46.515] - Field: 'conditions' [15:31:46.515] - Field: 'expr' [15:31:46.516] - Field: 'uuid' [15:31:46.516] - Field: 'seed' [15:31:46.517] - Field: 'version' [15:31:46.517] - Field: 'result' [15:31:46.517] - Field: 'asynchronous' [15:31:46.518] - Field: 'calls' [15:31:46.518] - Field: 'globals' [15:31:46.518] - Field: 'stdout' [15:31:46.519] - Field: 'earlySignal' [15:31:46.519] - Field: 'lazy' [15:31:46.519] - Field: 'state' [15:31:46.520] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:46.520] - Launch lazy future ... [15:31:46.521] Packages needed by the future expression (n = 0): [15:31:46.521] Packages needed by future strategies (n = 0): [15:31:46.522] { [15:31:46.522] { [15:31:46.522] { [15:31:46.522] ...future.startTime <- base::Sys.time() [15:31:46.522] { [15:31:46.522] { [15:31:46.522] { [15:31:46.522] base::local({ [15:31:46.522] has_future <- base::requireNamespace("future", [15:31:46.522] quietly = TRUE) [15:31:46.522] if (has_future) { [15:31:46.522] ns <- base::getNamespace("future") [15:31:46.522] version <- ns[[".package"]][["version"]] [15:31:46.522] if (is.null(version)) [15:31:46.522] version <- utils::packageVersion("future") [15:31:46.522] } [15:31:46.522] else { [15:31:46.522] version <- NULL [15:31:46.522] } [15:31:46.522] if (!has_future || version < "1.8.0") { [15:31:46.522] info <- base::c(r_version = base::gsub("R version ", [15:31:46.522] "", base::R.version$version.string), [15:31:46.522] platform = base::sprintf("%s (%s-bit)", [15:31:46.522] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:46.522] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:46.522] "release", "version")], collapse = " "), [15:31:46.522] hostname = base::Sys.info()[["nodename"]]) [15:31:46.522] info <- base::sprintf("%s: %s", base::names(info), [15:31:46.522] info) [15:31:46.522] info <- base::paste(info, collapse = "; ") [15:31:46.522] if (!has_future) { [15:31:46.522] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:46.522] info) [15:31:46.522] } [15:31:46.522] else { [15:31:46.522] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:46.522] info, version) [15:31:46.522] } [15:31:46.522] base::stop(msg) [15:31:46.522] } [15:31:46.522] }) [15:31:46.522] } [15:31:46.522] ...future.strategy.old <- future::plan("list") [15:31:46.522] options(future.plan = NULL) [15:31:46.522] Sys.unsetenv("R_FUTURE_PLAN") [15:31:46.522] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:46.522] } [15:31:46.522] ...future.workdir <- getwd() [15:31:46.522] } [15:31:46.522] ...future.oldOptions <- base::as.list(base::.Options) [15:31:46.522] ...future.oldEnvVars <- base::Sys.getenv() [15:31:46.522] } [15:31:46.522] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:46.522] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:46.522] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:46.522] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:46.522] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:46.522] future.stdout.windows.reencode = NULL, width = 80L) [15:31:46.522] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:46.522] base::names(...future.oldOptions)) [15:31:46.522] } [15:31:46.522] if (FALSE) { [15:31:46.522] } [15:31:46.522] else { [15:31:46.522] if (TRUE) { [15:31:46.522] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:46.522] open = "w") [15:31:46.522] } [15:31:46.522] else { [15:31:46.522] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:46.522] windows = "NUL", "/dev/null"), open = "w") [15:31:46.522] } [15:31:46.522] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:46.522] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:46.522] base::sink(type = "output", split = FALSE) [15:31:46.522] base::close(...future.stdout) [15:31:46.522] }, add = TRUE) [15:31:46.522] } [15:31:46.522] ...future.frame <- base::sys.nframe() [15:31:46.522] ...future.conditions <- base::list() [15:31:46.522] ...future.rng <- base::globalenv()$.Random.seed [15:31:46.522] if (FALSE) { [15:31:46.522] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:46.522] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:46.522] } [15:31:46.522] ...future.result <- base::tryCatch({ [15:31:46.522] base::withCallingHandlers({ [15:31:46.522] ...future.value <- base::withVisible(base::local({ [15:31:46.522] do.call(function(...) { [15:31:46.522] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.522] if (!identical(...future.globals.maxSize.org, [15:31:46.522] ...future.globals.maxSize)) { [15:31:46.522] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.522] on.exit(options(oopts), add = TRUE) [15:31:46.522] } [15:31:46.522] { [15:31:46.522] lapply(seq_along(...future.elements_ii), [15:31:46.522] FUN = function(jj) { [15:31:46.522] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.522] ...future.FUN(...future.X_jj, ...) [15:31:46.522] }) [15:31:46.522] } [15:31:46.522] }, args = future.call.arguments) [15:31:46.522] })) [15:31:46.522] future::FutureResult(value = ...future.value$value, [15:31:46.522] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:46.522] ...future.rng), globalenv = if (FALSE) [15:31:46.522] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:46.522] ...future.globalenv.names)) [15:31:46.522] else NULL, started = ...future.startTime, version = "1.8") [15:31:46.522] }, condition = base::local({ [15:31:46.522] c <- base::c [15:31:46.522] inherits <- base::inherits [15:31:46.522] invokeRestart <- base::invokeRestart [15:31:46.522] length <- base::length [15:31:46.522] list <- base::list [15:31:46.522] seq.int <- base::seq.int [15:31:46.522] signalCondition <- base::signalCondition [15:31:46.522] sys.calls <- base::sys.calls [15:31:46.522] `[[` <- base::`[[` [15:31:46.522] `+` <- base::`+` [15:31:46.522] `<<-` <- base::`<<-` [15:31:46.522] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:46.522] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:46.522] 3L)] [15:31:46.522] } [15:31:46.522] function(cond) { [15:31:46.522] is_error <- inherits(cond, "error") [15:31:46.522] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:46.522] NULL) [15:31:46.522] if (is_error) { [15:31:46.522] sessionInformation <- function() { [15:31:46.522] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:46.522] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:46.522] search = base::search(), system = base::Sys.info()) [15:31:46.522] } [15:31:46.522] ...future.conditions[[length(...future.conditions) + [15:31:46.522] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:46.522] cond$call), session = sessionInformation(), [15:31:46.522] timestamp = base::Sys.time(), signaled = 0L) [15:31:46.522] signalCondition(cond) [15:31:46.522] } [15:31:46.522] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:46.522] "immediateCondition"))) { [15:31:46.522] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:46.522] ...future.conditions[[length(...future.conditions) + [15:31:46.522] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:46.522] if (TRUE && !signal) { [15:31:46.522] muffleCondition <- function (cond, pattern = "^muffle") [15:31:46.522] { [15:31:46.522] inherits <- base::inherits [15:31:46.522] invokeRestart <- base::invokeRestart [15:31:46.522] is.null <- base::is.null [15:31:46.522] muffled <- FALSE [15:31:46.522] if (inherits(cond, "message")) { [15:31:46.522] muffled <- grepl(pattern, "muffleMessage") [15:31:46.522] if (muffled) [15:31:46.522] invokeRestart("muffleMessage") [15:31:46.522] } [15:31:46.522] else if (inherits(cond, "warning")) { [15:31:46.522] muffled <- grepl(pattern, "muffleWarning") [15:31:46.522] if (muffled) [15:31:46.522] invokeRestart("muffleWarning") [15:31:46.522] } [15:31:46.522] else if (inherits(cond, "condition")) { [15:31:46.522] if (!is.null(pattern)) { [15:31:46.522] computeRestarts <- base::computeRestarts [15:31:46.522] grepl <- base::grepl [15:31:46.522] restarts <- computeRestarts(cond) [15:31:46.522] for (restart in restarts) { [15:31:46.522] name <- restart$name [15:31:46.522] if (is.null(name)) [15:31:46.522] next [15:31:46.522] if (!grepl(pattern, name)) [15:31:46.522] next [15:31:46.522] invokeRestart(restart) [15:31:46.522] muffled <- TRUE [15:31:46.522] break [15:31:46.522] } [15:31:46.522] } [15:31:46.522] } [15:31:46.522] invisible(muffled) [15:31:46.522] } [15:31:46.522] muffleCondition(cond, pattern = "^muffle") [15:31:46.522] } [15:31:46.522] } [15:31:46.522] else { [15:31:46.522] if (TRUE) { [15:31:46.522] muffleCondition <- function (cond, pattern = "^muffle") [15:31:46.522] { [15:31:46.522] inherits <- base::inherits [15:31:46.522] invokeRestart <- base::invokeRestart [15:31:46.522] is.null <- base::is.null [15:31:46.522] muffled <- FALSE [15:31:46.522] if (inherits(cond, "message")) { [15:31:46.522] muffled <- grepl(pattern, "muffleMessage") [15:31:46.522] if (muffled) [15:31:46.522] invokeRestart("muffleMessage") [15:31:46.522] } [15:31:46.522] else if (inherits(cond, "warning")) { [15:31:46.522] muffled <- grepl(pattern, "muffleWarning") [15:31:46.522] if (muffled) [15:31:46.522] invokeRestart("muffleWarning") [15:31:46.522] } [15:31:46.522] else if (inherits(cond, "condition")) { [15:31:46.522] if (!is.null(pattern)) { [15:31:46.522] computeRestarts <- base::computeRestarts [15:31:46.522] grepl <- base::grepl [15:31:46.522] restarts <- computeRestarts(cond) [15:31:46.522] for (restart in restarts) { [15:31:46.522] name <- restart$name [15:31:46.522] if (is.null(name)) [15:31:46.522] next [15:31:46.522] if (!grepl(pattern, name)) [15:31:46.522] next [15:31:46.522] invokeRestart(restart) [15:31:46.522] muffled <- TRUE [15:31:46.522] break [15:31:46.522] } [15:31:46.522] } [15:31:46.522] } [15:31:46.522] invisible(muffled) [15:31:46.522] } [15:31:46.522] muffleCondition(cond, pattern = "^muffle") [15:31:46.522] } [15:31:46.522] } [15:31:46.522] } [15:31:46.522] })) [15:31:46.522] }, error = function(ex) { [15:31:46.522] base::structure(base::list(value = NULL, visible = NULL, [15:31:46.522] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:46.522] ...future.rng), started = ...future.startTime, [15:31:46.522] finished = Sys.time(), session_uuid = NA_character_, [15:31:46.522] version = "1.8"), class = "FutureResult") [15:31:46.522] }, finally = { [15:31:46.522] if (!identical(...future.workdir, getwd())) [15:31:46.522] setwd(...future.workdir) [15:31:46.522] { [15:31:46.522] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:46.522] ...future.oldOptions$nwarnings <- NULL [15:31:46.522] } [15:31:46.522] base::options(...future.oldOptions) [15:31:46.522] if (.Platform$OS.type == "windows") { [15:31:46.522] old_names <- names(...future.oldEnvVars) [15:31:46.522] envs <- base::Sys.getenv() [15:31:46.522] names <- names(envs) [15:31:46.522] common <- intersect(names, old_names) [15:31:46.522] added <- setdiff(names, old_names) [15:31:46.522] removed <- setdiff(old_names, names) [15:31:46.522] changed <- common[...future.oldEnvVars[common] != [15:31:46.522] envs[common]] [15:31:46.522] NAMES <- toupper(changed) [15:31:46.522] args <- list() [15:31:46.522] for (kk in seq_along(NAMES)) { [15:31:46.522] name <- changed[[kk]] [15:31:46.522] NAME <- NAMES[[kk]] [15:31:46.522] if (name != NAME && is.element(NAME, old_names)) [15:31:46.522] next [15:31:46.522] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:46.522] } [15:31:46.522] NAMES <- toupper(added) [15:31:46.522] for (kk in seq_along(NAMES)) { [15:31:46.522] name <- added[[kk]] [15:31:46.522] NAME <- NAMES[[kk]] [15:31:46.522] if (name != NAME && is.element(NAME, old_names)) [15:31:46.522] next [15:31:46.522] args[[name]] <- "" [15:31:46.522] } [15:31:46.522] NAMES <- toupper(removed) [15:31:46.522] for (kk in seq_along(NAMES)) { [15:31:46.522] name <- removed[[kk]] [15:31:46.522] NAME <- NAMES[[kk]] [15:31:46.522] if (name != NAME && is.element(NAME, old_names)) [15:31:46.522] next [15:31:46.522] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:46.522] } [15:31:46.522] if (length(args) > 0) [15:31:46.522] base::do.call(base::Sys.setenv, args = args) [15:31:46.522] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:46.522] } [15:31:46.522] else { [15:31:46.522] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:46.522] } [15:31:46.522] { [15:31:46.522] if (base::length(...future.futureOptionsAdded) > [15:31:46.522] 0L) { [15:31:46.522] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:46.522] base::names(opts) <- ...future.futureOptionsAdded [15:31:46.522] base::options(opts) [15:31:46.522] } [15:31:46.522] { [15:31:46.522] { [15:31:46.522] NULL [15:31:46.522] RNGkind("Mersenne-Twister") [15:31:46.522] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:46.522] inherits = FALSE) [15:31:46.522] } [15:31:46.522] options(future.plan = NULL) [15:31:46.522] if (is.na(NA_character_)) [15:31:46.522] Sys.unsetenv("R_FUTURE_PLAN") [15:31:46.522] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:46.522] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:46.522] .init = FALSE) [15:31:46.522] } [15:31:46.522] } [15:31:46.522] } [15:31:46.522] }) [15:31:46.522] if (TRUE) { [15:31:46.522] base::sink(type = "output", split = FALSE) [15:31:46.522] if (TRUE) { [15:31:46.522] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:46.522] } [15:31:46.522] else { [15:31:46.522] ...future.result["stdout"] <- base::list(NULL) [15:31:46.522] } [15:31:46.522] base::close(...future.stdout) [15:31:46.522] ...future.stdout <- NULL [15:31:46.522] } [15:31:46.522] ...future.result$conditions <- ...future.conditions [15:31:46.522] ...future.result$finished <- base::Sys.time() [15:31:46.522] ...future.result [15:31:46.522] } [15:31:46.531] assign_globals() ... [15:31:46.531] List of 5 [15:31:46.531] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:46.531] $ future.call.arguments :List of 1 [15:31:46.531] ..$ length: int 2 [15:31:46.531] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.531] $ ...future.elements_ii :List of 4 [15:31:46.531] ..$ c: chr "list" [15:31:46.531] ..$ a: chr "integer" [15:31:46.531] ..$ c: chr "character" [15:31:46.531] ..$ b: chr "numeric" [15:31:46.531] $ ...future.seeds_ii : NULL [15:31:46.531] $ ...future.globals.maxSize: NULL [15:31:46.531] - attr(*, "where")=List of 5 [15:31:46.531] ..$ ...future.FUN : [15:31:46.531] ..$ future.call.arguments : [15:31:46.531] ..$ ...future.elements_ii : [15:31:46.531] ..$ ...future.seeds_ii : [15:31:46.531] ..$ ...future.globals.maxSize: [15:31:46.531] - attr(*, "resolved")= logi FALSE [15:31:46.531] - attr(*, "total_size")= num 2240 [15:31:46.531] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.531] - attr(*, "already-done")= logi TRUE [15:31:46.545] - copied '...future.FUN' to environment [15:31:46.545] - copied 'future.call.arguments' to environment [15:31:46.546] - copied '...future.elements_ii' to environment [15:31:46.546] - copied '...future.seeds_ii' to environment [15:31:46.546] - copied '...future.globals.maxSize' to environment [15:31:46.547] assign_globals() ... done [15:31:46.548] plan(): Setting new future strategy stack: [15:31:46.548] List of future strategies: [15:31:46.548] 1. sequential: [15:31:46.548] - args: function (..., envir = parent.frame(), workers = "") [15:31:46.548] - tweaked: FALSE [15:31:46.548] - call: NULL [15:31:46.549] plan(): nbrOfWorkers() = 1 [15:31:46.552] plan(): Setting new future strategy stack: [15:31:46.552] List of future strategies: [15:31:46.552] 1. sequential: [15:31:46.552] - args: function (..., envir = parent.frame(), workers = "") [15:31:46.552] - tweaked: FALSE [15:31:46.552] - call: plan(strategy) [15:31:46.558] plan(): nbrOfWorkers() = 1 [15:31:46.559] SequentialFuture started (and completed) [15:31:46.559] - Launch lazy future ... done [15:31:46.560] run() for 'SequentialFuture' ... done [15:31:46.560] Created future: [15:31:46.561] SequentialFuture: [15:31:46.561] Label: 'future_lapply-1' [15:31:46.561] Expression: [15:31:46.561] { [15:31:46.561] do.call(function(...) { [15:31:46.561] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.561] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:46.561] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.561] on.exit(options(oopts), add = TRUE) [15:31:46.561] } [15:31:46.561] { [15:31:46.561] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:46.561] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.561] ...future.FUN(...future.X_jj, ...) [15:31:46.561] }) [15:31:46.561] } [15:31:46.561] }, args = future.call.arguments) [15:31:46.561] } [15:31:46.561] Lazy evaluation: FALSE [15:31:46.561] Asynchronous evaluation: FALSE [15:31:46.561] Local evaluation: TRUE [15:31:46.561] Environment: R_GlobalEnv [15:31:46.561] Capture standard output: TRUE [15:31:46.561] Capture condition classes: 'condition' (excluding 'nothing') [15:31:46.561] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:46.561] Packages: [15:31:46.561] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:46.561] Resolved: TRUE [15:31:46.561] Value: 240 bytes of class 'list' [15:31:46.561] Early signaling: FALSE [15:31:46.561] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:46.561] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:46.564] Chunk #1 of 1 ... DONE [15:31:46.564] Launching 1 futures (chunks) ... DONE [15:31:46.565] Resolving 1 futures (chunks) ... [15:31:46.565] resolve() on list ... [15:31:46.565] recursive: 0 [15:31:46.566] length: 1 [15:31:46.566] [15:31:46.567] resolved() for 'SequentialFuture' ... [15:31:46.567] - state: 'finished' [15:31:46.567] - run: TRUE [15:31:46.568] - result: 'FutureResult' [15:31:46.568] resolved() for 'SequentialFuture' ... done [15:31:46.569] Future #1 [15:31:46.569] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:46.570] - nx: 1 [15:31:46.570] - relay: TRUE [15:31:46.571] - stdout: TRUE [15:31:46.571] - signal: TRUE [15:31:46.571] - resignal: FALSE [15:31:46.572] - force: TRUE [15:31:46.572] - relayed: [n=1] FALSE [15:31:46.572] - queued futures: [n=1] FALSE [15:31:46.573] - until=1 [15:31:46.573] - relaying element #1 [15:31:46.574] - relayed: [n=1] TRUE [15:31:46.574] - queued futures: [n=1] TRUE [15:31:46.574] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:46.575] length: 0 (resolved future 1) [15:31:46.575] Relaying remaining futures [15:31:46.575] signalConditionsASAP(NULL, pos=0) ... [15:31:46.576] - nx: 1 [15:31:46.576] - relay: TRUE [15:31:46.576] - stdout: TRUE [15:31:46.577] - signal: TRUE [15:31:46.577] - resignal: FALSE [15:31:46.577] - force: TRUE [15:31:46.578] - relayed: [n=1] TRUE [15:31:46.578] - queued futures: [n=1] TRUE - flush all [15:31:46.578] - relayed: [n=1] TRUE [15:31:46.579] - queued futures: [n=1] TRUE [15:31:46.579] signalConditionsASAP(NULL, pos=0) ... done [15:31:46.579] resolve() on list ... DONE [15:31:46.580] - Number of value chunks collected: 1 [15:31:46.580] Resolving 1 futures (chunks) ... DONE [15:31:46.580] Reducing values from 1 chunks ... [15:31:46.580] - Number of values collected after concatenation: 4 [15:31:46.581] - Number of values expected: 4 [15:31:46.581] Reverse index remapping (attribute 'ordering'): [n = 4] 2, 4, 3, 1 [15:31:46.581] Reducing values from 1 chunks ... DONE [15:31:46.581] 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, ...) ... [15:31:46.586] future_lapply() ... [15:31:46.587] Number of chunks: 1 [15:31:46.587] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 1, 2 [15:31:46.587] getGlobalsAndPackagesXApply() ... [15:31:46.588] - future.globals: TRUE [15:31:46.588] getGlobalsAndPackages() ... [15:31:46.588] Searching for globals... [15:31:46.590] - globals found: [2] 'FUN', '.Internal' [15:31:46.591] Searching for globals ... DONE [15:31:46.591] Resolving globals: FALSE [15:31:46.592] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:46.592] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:46.593] - globals: [1] 'FUN' [15:31:46.593] [15:31:46.593] getGlobalsAndPackages() ... DONE [15:31:46.593] - globals found/used: [n=1] 'FUN' [15:31:46.594] - needed namespaces: [n=0] [15:31:46.594] Finding globals ... DONE [15:31:46.594] - use_args: TRUE [15:31:46.594] - Getting '...' globals ... [15:31:46.595] resolve() on list ... [15:31:46.595] recursive: 0 [15:31:46.595] length: 1 [15:31:46.596] elements: '...' [15:31:46.596] length: 0 (resolved future 1) [15:31:46.596] resolve() on list ... DONE [15:31:46.596] - '...' content: [n=1] 'length' [15:31:46.597] List of 1 [15:31:46.597] $ ...:List of 1 [15:31:46.597] ..$ length: int 2 [15:31:46.597] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.597] - attr(*, "where")=List of 1 [15:31:46.597] ..$ ...: [15:31:46.597] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.597] - attr(*, "resolved")= logi TRUE [15:31:46.597] - attr(*, "total_size")= num NA [15:31:46.602] - Getting '...' globals ... DONE [15:31:46.603] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:46.606] List of 2 [15:31:46.606] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:46.606] $ ... :List of 1 [15:31:46.606] ..$ length: int 2 [15:31:46.606] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.606] - attr(*, "where")=List of 2 [15:31:46.606] ..$ ...future.FUN: [15:31:46.606] ..$ ... : [15:31:46.606] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.606] - attr(*, "resolved")= logi FALSE [15:31:46.606] - attr(*, "total_size")= num 2240 [15:31:46.613] Packages to be attached in all futures: [n=0] [15:31:46.613] getGlobalsAndPackagesXApply() ... DONE [15:31:46.613] Number of futures (= number of chunks): 1 [15:31:46.614] Launching 1 futures (chunks) ... [15:31:46.614] Chunk #1 of 1 ... [15:31:46.614] - Finding globals in 'X' for chunk #1 ... [15:31:46.614] getGlobalsAndPackages() ... [15:31:46.615] Searching for globals... [15:31:46.615] [15:31:46.615] Searching for globals ... DONE [15:31:46.616] - globals: [0] [15:31:46.616] getGlobalsAndPackages() ... DONE [15:31:46.616] + additional globals found: [n=0] [15:31:46.616] + additional namespaces needed: [n=0] [15:31:46.617] - Finding globals in 'X' for chunk #1 ... DONE [15:31:46.617] - seeds: [15:31:46.617] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.618] getGlobalsAndPackages() ... [15:31:46.618] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.618] Resolving globals: FALSE [15:31:46.618] Tweak future expression to call with '...' arguments ... [15:31:46.619] { [15:31:46.619] do.call(function(...) { [15:31:46.619] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.619] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:46.619] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.619] on.exit(options(oopts), add = TRUE) [15:31:46.619] } [15:31:46.619] { [15:31:46.619] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:46.619] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.619] ...future.FUN(...future.X_jj, ...) [15:31:46.619] }) [15:31:46.619] } [15:31:46.619] }, args = future.call.arguments) [15:31:46.619] } [15:31:46.619] Tweak future expression to call with '...' arguments ... DONE [15:31:46.620] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.620] [15:31:46.621] getGlobalsAndPackages() ... DONE [15:31:46.621] run() for 'Future' ... [15:31:46.622] - state: 'created' [15:31:46.622] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:46.623] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:46.623] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:46.623] - Field: 'label' [15:31:46.623] - Field: 'local' [15:31:46.624] - Field: 'owner' [15:31:46.624] - Field: 'envir' [15:31:46.624] - Field: 'packages' [15:31:46.624] - Field: 'gc' [15:31:46.625] - Field: 'conditions' [15:31:46.625] - Field: 'expr' [15:31:46.625] - Field: 'uuid' [15:31:46.626] - Field: 'seed' [15:31:46.626] - Field: 'version' [15:31:46.626] - Field: 'result' [15:31:46.626] - Field: 'asynchronous' [15:31:46.627] - Field: 'calls' [15:31:46.627] - Field: 'globals' [15:31:46.627] - Field: 'stdout' [15:31:46.628] - Field: 'earlySignal' [15:31:46.628] - Field: 'lazy' [15:31:46.628] - Field: 'state' [15:31:46.628] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:46.629] - Launch lazy future ... [15:31:46.629] Packages needed by the future expression (n = 0): [15:31:46.629] Packages needed by future strategies (n = 0): [15:31:46.630] { [15:31:46.630] { [15:31:46.630] { [15:31:46.630] ...future.startTime <- base::Sys.time() [15:31:46.630] { [15:31:46.630] { [15:31:46.630] { [15:31:46.630] base::local({ [15:31:46.630] has_future <- base::requireNamespace("future", [15:31:46.630] quietly = TRUE) [15:31:46.630] if (has_future) { [15:31:46.630] ns <- base::getNamespace("future") [15:31:46.630] version <- ns[[".package"]][["version"]] [15:31:46.630] if (is.null(version)) [15:31:46.630] version <- utils::packageVersion("future") [15:31:46.630] } [15:31:46.630] else { [15:31:46.630] version <- NULL [15:31:46.630] } [15:31:46.630] if (!has_future || version < "1.8.0") { [15:31:46.630] info <- base::c(r_version = base::gsub("R version ", [15:31:46.630] "", base::R.version$version.string), [15:31:46.630] platform = base::sprintf("%s (%s-bit)", [15:31:46.630] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:46.630] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:46.630] "release", "version")], collapse = " "), [15:31:46.630] hostname = base::Sys.info()[["nodename"]]) [15:31:46.630] info <- base::sprintf("%s: %s", base::names(info), [15:31:46.630] info) [15:31:46.630] info <- base::paste(info, collapse = "; ") [15:31:46.630] if (!has_future) { [15:31:46.630] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:46.630] info) [15:31:46.630] } [15:31:46.630] else { [15:31:46.630] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:46.630] info, version) [15:31:46.630] } [15:31:46.630] base::stop(msg) [15:31:46.630] } [15:31:46.630] }) [15:31:46.630] } [15:31:46.630] ...future.strategy.old <- future::plan("list") [15:31:46.630] options(future.plan = NULL) [15:31:46.630] Sys.unsetenv("R_FUTURE_PLAN") [15:31:46.630] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:46.630] } [15:31:46.630] ...future.workdir <- getwd() [15:31:46.630] } [15:31:46.630] ...future.oldOptions <- base::as.list(base::.Options) [15:31:46.630] ...future.oldEnvVars <- base::Sys.getenv() [15:31:46.630] } [15:31:46.630] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:46.630] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:46.630] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:46.630] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:46.630] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:46.630] future.stdout.windows.reencode = NULL, width = 80L) [15:31:46.630] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:46.630] base::names(...future.oldOptions)) [15:31:46.630] } [15:31:46.630] if (FALSE) { [15:31:46.630] } [15:31:46.630] else { [15:31:46.630] if (TRUE) { [15:31:46.630] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:46.630] open = "w") [15:31:46.630] } [15:31:46.630] else { [15:31:46.630] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:46.630] windows = "NUL", "/dev/null"), open = "w") [15:31:46.630] } [15:31:46.630] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:46.630] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:46.630] base::sink(type = "output", split = FALSE) [15:31:46.630] base::close(...future.stdout) [15:31:46.630] }, add = TRUE) [15:31:46.630] } [15:31:46.630] ...future.frame <- base::sys.nframe() [15:31:46.630] ...future.conditions <- base::list() [15:31:46.630] ...future.rng <- base::globalenv()$.Random.seed [15:31:46.630] if (FALSE) { [15:31:46.630] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:46.630] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:46.630] } [15:31:46.630] ...future.result <- base::tryCatch({ [15:31:46.630] base::withCallingHandlers({ [15:31:46.630] ...future.value <- base::withVisible(base::local({ [15:31:46.630] do.call(function(...) { [15:31:46.630] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.630] if (!identical(...future.globals.maxSize.org, [15:31:46.630] ...future.globals.maxSize)) { [15:31:46.630] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.630] on.exit(options(oopts), add = TRUE) [15:31:46.630] } [15:31:46.630] { [15:31:46.630] lapply(seq_along(...future.elements_ii), [15:31:46.630] FUN = function(jj) { [15:31:46.630] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.630] ...future.FUN(...future.X_jj, ...) [15:31:46.630] }) [15:31:46.630] } [15:31:46.630] }, args = future.call.arguments) [15:31:46.630] })) [15:31:46.630] future::FutureResult(value = ...future.value$value, [15:31:46.630] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:46.630] ...future.rng), globalenv = if (FALSE) [15:31:46.630] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:46.630] ...future.globalenv.names)) [15:31:46.630] else NULL, started = ...future.startTime, version = "1.8") [15:31:46.630] }, condition = base::local({ [15:31:46.630] c <- base::c [15:31:46.630] inherits <- base::inherits [15:31:46.630] invokeRestart <- base::invokeRestart [15:31:46.630] length <- base::length [15:31:46.630] list <- base::list [15:31:46.630] seq.int <- base::seq.int [15:31:46.630] signalCondition <- base::signalCondition [15:31:46.630] sys.calls <- base::sys.calls [15:31:46.630] `[[` <- base::`[[` [15:31:46.630] `+` <- base::`+` [15:31:46.630] `<<-` <- base::`<<-` [15:31:46.630] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:46.630] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:46.630] 3L)] [15:31:46.630] } [15:31:46.630] function(cond) { [15:31:46.630] is_error <- inherits(cond, "error") [15:31:46.630] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:46.630] NULL) [15:31:46.630] if (is_error) { [15:31:46.630] sessionInformation <- function() { [15:31:46.630] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:46.630] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:46.630] search = base::search(), system = base::Sys.info()) [15:31:46.630] } [15:31:46.630] ...future.conditions[[length(...future.conditions) + [15:31:46.630] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:46.630] cond$call), session = sessionInformation(), [15:31:46.630] timestamp = base::Sys.time(), signaled = 0L) [15:31:46.630] signalCondition(cond) [15:31:46.630] } [15:31:46.630] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:46.630] "immediateCondition"))) { [15:31:46.630] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:46.630] ...future.conditions[[length(...future.conditions) + [15:31:46.630] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:46.630] if (TRUE && !signal) { [15:31:46.630] muffleCondition <- function (cond, pattern = "^muffle") [15:31:46.630] { [15:31:46.630] inherits <- base::inherits [15:31:46.630] invokeRestart <- base::invokeRestart [15:31:46.630] is.null <- base::is.null [15:31:46.630] muffled <- FALSE [15:31:46.630] if (inherits(cond, "message")) { [15:31:46.630] muffled <- grepl(pattern, "muffleMessage") [15:31:46.630] if (muffled) [15:31:46.630] invokeRestart("muffleMessage") [15:31:46.630] } [15:31:46.630] else if (inherits(cond, "warning")) { [15:31:46.630] muffled <- grepl(pattern, "muffleWarning") [15:31:46.630] if (muffled) [15:31:46.630] invokeRestart("muffleWarning") [15:31:46.630] } [15:31:46.630] else if (inherits(cond, "condition")) { [15:31:46.630] if (!is.null(pattern)) { [15:31:46.630] computeRestarts <- base::computeRestarts [15:31:46.630] grepl <- base::grepl [15:31:46.630] restarts <- computeRestarts(cond) [15:31:46.630] for (restart in restarts) { [15:31:46.630] name <- restart$name [15:31:46.630] if (is.null(name)) [15:31:46.630] next [15:31:46.630] if (!grepl(pattern, name)) [15:31:46.630] next [15:31:46.630] invokeRestart(restart) [15:31:46.630] muffled <- TRUE [15:31:46.630] break [15:31:46.630] } [15:31:46.630] } [15:31:46.630] } [15:31:46.630] invisible(muffled) [15:31:46.630] } [15:31:46.630] muffleCondition(cond, pattern = "^muffle") [15:31:46.630] } [15:31:46.630] } [15:31:46.630] else { [15:31:46.630] if (TRUE) { [15:31:46.630] muffleCondition <- function (cond, pattern = "^muffle") [15:31:46.630] { [15:31:46.630] inherits <- base::inherits [15:31:46.630] invokeRestart <- base::invokeRestart [15:31:46.630] is.null <- base::is.null [15:31:46.630] muffled <- FALSE [15:31:46.630] if (inherits(cond, "message")) { [15:31:46.630] muffled <- grepl(pattern, "muffleMessage") [15:31:46.630] if (muffled) [15:31:46.630] invokeRestart("muffleMessage") [15:31:46.630] } [15:31:46.630] else if (inherits(cond, "warning")) { [15:31:46.630] muffled <- grepl(pattern, "muffleWarning") [15:31:46.630] if (muffled) [15:31:46.630] invokeRestart("muffleWarning") [15:31:46.630] } [15:31:46.630] else if (inherits(cond, "condition")) { [15:31:46.630] if (!is.null(pattern)) { [15:31:46.630] computeRestarts <- base::computeRestarts [15:31:46.630] grepl <- base::grepl [15:31:46.630] restarts <- computeRestarts(cond) [15:31:46.630] for (restart in restarts) { [15:31:46.630] name <- restart$name [15:31:46.630] if (is.null(name)) [15:31:46.630] next [15:31:46.630] if (!grepl(pattern, name)) [15:31:46.630] next [15:31:46.630] invokeRestart(restart) [15:31:46.630] muffled <- TRUE [15:31:46.630] break [15:31:46.630] } [15:31:46.630] } [15:31:46.630] } [15:31:46.630] invisible(muffled) [15:31:46.630] } [15:31:46.630] muffleCondition(cond, pattern = "^muffle") [15:31:46.630] } [15:31:46.630] } [15:31:46.630] } [15:31:46.630] })) [15:31:46.630] }, error = function(ex) { [15:31:46.630] base::structure(base::list(value = NULL, visible = NULL, [15:31:46.630] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:46.630] ...future.rng), started = ...future.startTime, [15:31:46.630] finished = Sys.time(), session_uuid = NA_character_, [15:31:46.630] version = "1.8"), class = "FutureResult") [15:31:46.630] }, finally = { [15:31:46.630] if (!identical(...future.workdir, getwd())) [15:31:46.630] setwd(...future.workdir) [15:31:46.630] { [15:31:46.630] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:46.630] ...future.oldOptions$nwarnings <- NULL [15:31:46.630] } [15:31:46.630] base::options(...future.oldOptions) [15:31:46.630] if (.Platform$OS.type == "windows") { [15:31:46.630] old_names <- names(...future.oldEnvVars) [15:31:46.630] envs <- base::Sys.getenv() [15:31:46.630] names <- names(envs) [15:31:46.630] common <- intersect(names, old_names) [15:31:46.630] added <- setdiff(names, old_names) [15:31:46.630] removed <- setdiff(old_names, names) [15:31:46.630] changed <- common[...future.oldEnvVars[common] != [15:31:46.630] envs[common]] [15:31:46.630] NAMES <- toupper(changed) [15:31:46.630] args <- list() [15:31:46.630] for (kk in seq_along(NAMES)) { [15:31:46.630] name <- changed[[kk]] [15:31:46.630] NAME <- NAMES[[kk]] [15:31:46.630] if (name != NAME && is.element(NAME, old_names)) [15:31:46.630] next [15:31:46.630] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:46.630] } [15:31:46.630] NAMES <- toupper(added) [15:31:46.630] for (kk in seq_along(NAMES)) { [15:31:46.630] name <- added[[kk]] [15:31:46.630] NAME <- NAMES[[kk]] [15:31:46.630] if (name != NAME && is.element(NAME, old_names)) [15:31:46.630] next [15:31:46.630] args[[name]] <- "" [15:31:46.630] } [15:31:46.630] NAMES <- toupper(removed) [15:31:46.630] for (kk in seq_along(NAMES)) { [15:31:46.630] name <- removed[[kk]] [15:31:46.630] NAME <- NAMES[[kk]] [15:31:46.630] if (name != NAME && is.element(NAME, old_names)) [15:31:46.630] next [15:31:46.630] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:46.630] } [15:31:46.630] if (length(args) > 0) [15:31:46.630] base::do.call(base::Sys.setenv, args = args) [15:31:46.630] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:46.630] } [15:31:46.630] else { [15:31:46.630] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:46.630] } [15:31:46.630] { [15:31:46.630] if (base::length(...future.futureOptionsAdded) > [15:31:46.630] 0L) { [15:31:46.630] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:46.630] base::names(opts) <- ...future.futureOptionsAdded [15:31:46.630] base::options(opts) [15:31:46.630] } [15:31:46.630] { [15:31:46.630] { [15:31:46.630] NULL [15:31:46.630] RNGkind("Mersenne-Twister") [15:31:46.630] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:46.630] inherits = FALSE) [15:31:46.630] } [15:31:46.630] options(future.plan = NULL) [15:31:46.630] if (is.na(NA_character_)) [15:31:46.630] Sys.unsetenv("R_FUTURE_PLAN") [15:31:46.630] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:46.630] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:46.630] .init = FALSE) [15:31:46.630] } [15:31:46.630] } [15:31:46.630] } [15:31:46.630] }) [15:31:46.630] if (TRUE) { [15:31:46.630] base::sink(type = "output", split = FALSE) [15:31:46.630] if (TRUE) { [15:31:46.630] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:46.630] } [15:31:46.630] else { [15:31:46.630] ...future.result["stdout"] <- base::list(NULL) [15:31:46.630] } [15:31:46.630] base::close(...future.stdout) [15:31:46.630] ...future.stdout <- NULL [15:31:46.630] } [15:31:46.630] ...future.result$conditions <- ...future.conditions [15:31:46.630] ...future.result$finished <- base::Sys.time() [15:31:46.630] ...future.result [15:31:46.630] } [15:31:46.637] assign_globals() ... [15:31:46.637] List of 5 [15:31:46.637] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:46.637] $ future.call.arguments :List of 1 [15:31:46.637] ..$ length: int 2 [15:31:46.637] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.637] $ ...future.elements_ii :List of 4 [15:31:46.637] ..$ c: chr "list" [15:31:46.637] ..$ c: chr "character" [15:31:46.637] ..$ a: chr "integer" [15:31:46.637] ..$ b: chr "numeric" [15:31:46.637] $ ...future.seeds_ii : NULL [15:31:46.637] $ ...future.globals.maxSize: NULL [15:31:46.637] - attr(*, "where")=List of 5 [15:31:46.637] ..$ ...future.FUN : [15:31:46.637] ..$ future.call.arguments : [15:31:46.637] ..$ ...future.elements_ii : [15:31:46.637] ..$ ...future.seeds_ii : [15:31:46.637] ..$ ...future.globals.maxSize: [15:31:46.637] - attr(*, "resolved")= logi FALSE [15:31:46.637] - attr(*, "total_size")= num 2240 [15:31:46.637] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.637] - attr(*, "already-done")= logi TRUE [15:31:46.648] - copied '...future.FUN' to environment [15:31:46.648] - copied 'future.call.arguments' to environment [15:31:46.648] - copied '...future.elements_ii' to environment [15:31:46.649] - copied '...future.seeds_ii' to environment [15:31:46.652] - copied '...future.globals.maxSize' to environment [15:31:46.652] assign_globals() ... done [15:31:46.653] plan(): Setting new future strategy stack: [15:31:46.653] List of future strategies: [15:31:46.653] 1. sequential: [15:31:46.653] - args: function (..., envir = parent.frame(), workers = "") [15:31:46.653] - tweaked: FALSE [15:31:46.653] - call: NULL [15:31:46.654] plan(): nbrOfWorkers() = 1 [15:31:46.656] plan(): Setting new future strategy stack: [15:31:46.656] List of future strategies: [15:31:46.656] 1. sequential: [15:31:46.656] - args: function (..., envir = parent.frame(), workers = "") [15:31:46.656] - tweaked: FALSE [15:31:46.656] - call: plan(strategy) [15:31:46.657] plan(): nbrOfWorkers() = 1 [15:31:46.658] SequentialFuture started (and completed) [15:31:46.658] - Launch lazy future ... done [15:31:46.658] run() for 'SequentialFuture' ... done [15:31:46.659] Created future: [15:31:46.659] SequentialFuture: [15:31:46.659] Label: 'future_lapply-1' [15:31:46.659] Expression: [15:31:46.659] { [15:31:46.659] do.call(function(...) { [15:31:46.659] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.659] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:46.659] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.659] on.exit(options(oopts), add = TRUE) [15:31:46.659] } [15:31:46.659] { [15:31:46.659] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:46.659] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.659] ...future.FUN(...future.X_jj, ...) [15:31:46.659] }) [15:31:46.659] } [15:31:46.659] }, args = future.call.arguments) [15:31:46.659] } [15:31:46.659] Lazy evaluation: FALSE [15:31:46.659] Asynchronous evaluation: FALSE [15:31:46.659] Local evaluation: TRUE [15:31:46.659] Environment: R_GlobalEnv [15:31:46.659] Capture standard output: TRUE [15:31:46.659] Capture condition classes: 'condition' (excluding 'nothing') [15:31:46.659] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:46.659] Packages: [15:31:46.659] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:46.659] Resolved: TRUE [15:31:46.659] Value: 240 bytes of class 'list' [15:31:46.659] Early signaling: FALSE [15:31:46.659] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:46.659] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:46.661] Chunk #1 of 1 ... DONE [15:31:46.661] Launching 1 futures (chunks) ... DONE [15:31:46.662] Resolving 1 futures (chunks) ... [15:31:46.662] resolve() on list ... [15:31:46.662] recursive: 0 [15:31:46.662] length: 1 [15:31:46.663] [15:31:46.663] resolved() for 'SequentialFuture' ... [15:31:46.663] - state: 'finished' [15:31:46.663] - run: TRUE [15:31:46.664] - result: 'FutureResult' [15:31:46.664] resolved() for 'SequentialFuture' ... done [15:31:46.664] Future #1 [15:31:46.665] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:46.665] - nx: 1 [15:31:46.665] - relay: TRUE [15:31:46.665] - stdout: TRUE [15:31:46.665] - signal: TRUE [15:31:46.666] - resignal: FALSE [15:31:46.666] - force: TRUE [15:31:46.666] - relayed: [n=1] FALSE [15:31:46.666] - queued futures: [n=1] FALSE [15:31:46.667] - until=1 [15:31:46.667] - relaying element #1 [15:31:46.667] - relayed: [n=1] TRUE [15:31:46.667] - queued futures: [n=1] TRUE [15:31:46.668] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:46.668] length: 0 (resolved future 1) [15:31:46.668] Relaying remaining futures [15:31:46.668] signalConditionsASAP(NULL, pos=0) ... [15:31:46.669] - nx: 1 [15:31:46.669] - relay: TRUE [15:31:46.669] - stdout: TRUE [15:31:46.669] - signal: TRUE [15:31:46.670] - resignal: FALSE [15:31:46.670] - force: TRUE [15:31:46.670] - relayed: [n=1] TRUE [15:31:46.670] - queued futures: [n=1] TRUE - flush all [15:31:46.671] - relayed: [n=1] TRUE [15:31:46.671] - queued futures: [n=1] TRUE [15:31:46.671] signalConditionsASAP(NULL, pos=0) ... done [15:31:46.671] resolve() on list ... DONE [15:31:46.672] - Number of value chunks collected: 1 [15:31:46.672] Resolving 1 futures (chunks) ... DONE [15:31:46.672] Reducing values from 1 chunks ... [15:31:46.672] - Number of values collected after concatenation: 4 [15:31:46.673] - Number of values expected: 4 [15:31:46.673] Reverse index remapping (attribute 'ordering'): [n = 4] 3, 4, 2, 1 [15:31:46.673] Reducing values from 1 chunks ... DONE [15:31:46.673] 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, ...) ... [15:31:46.677] future_lapply() ... [15:31:46.694] Number of chunks: 1 [15:31:46.694] getGlobalsAndPackagesXApply() ... [15:31:46.694] - future.globals: TRUE [15:31:46.695] getGlobalsAndPackages() ... [15:31:46.695] Searching for globals... [15:31:46.710] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [15:31:46.710] Searching for globals ... DONE [15:31:46.711] Resolving globals: FALSE [15:31:46.712] The total size of the 1 globals is 69.62 KiB (71288 bytes) [15:31:46.713] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 69.62 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (69.62 KiB of class 'function') [15:31:46.713] - globals: [1] 'FUN' [15:31:46.714] - packages: [1] 'future' [15:31:46.714] getGlobalsAndPackages() ... DONE [15:31:46.714] - globals found/used: [n=1] 'FUN' [15:31:46.714] - needed namespaces: [n=1] 'future' [15:31:46.715] Finding globals ... DONE [15:31:46.715] - use_args: TRUE [15:31:46.715] - Getting '...' globals ... [15:31:46.716] resolve() on list ... [15:31:46.716] recursive: 0 [15:31:46.716] length: 1 [15:31:46.716] elements: '...' [15:31:46.717] length: 0 (resolved future 1) [15:31:46.717] resolve() on list ... DONE [15:31:46.717] - '...' content: [n=2] 'collapse', 'maxHead' [15:31:46.718] List of 1 [15:31:46.718] $ ...:List of 2 [15:31:46.718] ..$ collapse: chr "; " [15:31:46.718] ..$ maxHead : int 3 [15:31:46.718] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.718] - attr(*, "where")=List of 1 [15:31:46.718] ..$ ...: [15:31:46.718] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.718] - attr(*, "resolved")= logi TRUE [15:31:46.718] - attr(*, "total_size")= num NA [15:31:46.724] - Getting '...' globals ... DONE [15:31:46.727] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:46.727] List of 2 [15:31:46.727] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:46.727] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:46.727] $ ... :List of 2 [15:31:46.727] ..$ collapse: chr "; " [15:31:46.727] ..$ maxHead : int 3 [15:31:46.727] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.727] - attr(*, "where")=List of 2 [15:31:46.727] ..$ ...future.FUN: [15:31:46.727] ..$ ... : [15:31:46.727] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.727] - attr(*, "resolved")= logi FALSE [15:31:46.727] - attr(*, "total_size")= num 71456 [15:31:46.734] Packages to be attached in all futures: [n=1] 'future' [15:31:46.734] getGlobalsAndPackagesXApply() ... DONE [15:31:46.734] Number of futures (= number of chunks): 1 [15:31:46.735] Launching 1 futures (chunks) ... [15:31:46.735] Chunk #1 of 1 ... [15:31:46.735] - Finding globals in 'X' for chunk #1 ... [15:31:46.735] getGlobalsAndPackages() ... [15:31:46.736] Searching for globals... [15:31:46.736] [15:31:46.736] Searching for globals ... DONE [15:31:46.737] - globals: [0] [15:31:46.737] getGlobalsAndPackages() ... DONE [15:31:46.737] + additional globals found: [n=0] [15:31:46.738] + additional namespaces needed: [n=0] [15:31:46.738] - Finding globals in 'X' for chunk #1 ... DONE [15:31:46.738] - seeds: [15:31:46.738] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.739] getGlobalsAndPackages() ... [15:31:46.739] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.739] Resolving globals: FALSE [15:31:46.739] Tweak future expression to call with '...' arguments ... [15:31:46.740] { [15:31:46.740] do.call(function(...) { [15:31:46.740] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.740] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:46.740] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.740] on.exit(options(oopts), add = TRUE) [15:31:46.740] } [15:31:46.740] { [15:31:46.740] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:46.740] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.740] ...future.FUN(...future.X_jj, ...) [15:31:46.740] }) [15:31:46.740] } [15:31:46.740] }, args = future.call.arguments) [15:31:46.740] } [15:31:46.740] Tweak future expression to call with '...' arguments ... DONE [15:31:46.741] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.741] - packages: [1] 'future' [15:31:46.742] getGlobalsAndPackages() ... DONE [15:31:46.742] run() for 'Future' ... [15:31:46.742] - state: 'created' [15:31:46.743] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:46.743] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:46.744] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:46.744] - Field: 'label' [15:31:46.744] - Field: 'local' [15:31:46.744] - Field: 'owner' [15:31:46.745] - Field: 'envir' [15:31:46.745] - Field: 'packages' [15:31:46.745] - Field: 'gc' [15:31:46.745] - Field: 'conditions' [15:31:46.746] - Field: 'expr' [15:31:46.746] - Field: 'uuid' [15:31:46.746] - Field: 'seed' [15:31:46.746] - Field: 'version' [15:31:46.746] - Field: 'result' [15:31:46.747] - Field: 'asynchronous' [15:31:46.747] - Field: 'calls' [15:31:46.747] - Field: 'globals' [15:31:46.747] - Field: 'stdout' [15:31:46.748] - Field: 'earlySignal' [15:31:46.748] - Field: 'lazy' [15:31:46.748] - Field: 'state' [15:31:46.748] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:46.748] - Launch lazy future ... [15:31:46.749] Packages needed by the future expression (n = 1): 'future' [15:31:46.749] Packages needed by future strategies (n = 0): [15:31:46.750] { [15:31:46.750] { [15:31:46.750] { [15:31:46.750] ...future.startTime <- base::Sys.time() [15:31:46.750] { [15:31:46.750] { [15:31:46.750] { [15:31:46.750] { [15:31:46.750] base::local({ [15:31:46.750] has_future <- base::requireNamespace("future", [15:31:46.750] quietly = TRUE) [15:31:46.750] if (has_future) { [15:31:46.750] ns <- base::getNamespace("future") [15:31:46.750] version <- ns[[".package"]][["version"]] [15:31:46.750] if (is.null(version)) [15:31:46.750] version <- utils::packageVersion("future") [15:31:46.750] } [15:31:46.750] else { [15:31:46.750] version <- NULL [15:31:46.750] } [15:31:46.750] if (!has_future || version < "1.8.0") { [15:31:46.750] info <- base::c(r_version = base::gsub("R version ", [15:31:46.750] "", base::R.version$version.string), [15:31:46.750] platform = base::sprintf("%s (%s-bit)", [15:31:46.750] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:46.750] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:46.750] "release", "version")], collapse = " "), [15:31:46.750] hostname = base::Sys.info()[["nodename"]]) [15:31:46.750] info <- base::sprintf("%s: %s", base::names(info), [15:31:46.750] info) [15:31:46.750] info <- base::paste(info, collapse = "; ") [15:31:46.750] if (!has_future) { [15:31:46.750] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:46.750] info) [15:31:46.750] } [15:31:46.750] else { [15:31:46.750] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:46.750] info, version) [15:31:46.750] } [15:31:46.750] base::stop(msg) [15:31:46.750] } [15:31:46.750] }) [15:31:46.750] } [15:31:46.750] base::local({ [15:31:46.750] for (pkg in "future") { [15:31:46.750] base::loadNamespace(pkg) [15:31:46.750] base::library(pkg, character.only = TRUE) [15:31:46.750] } [15:31:46.750] }) [15:31:46.750] } [15:31:46.750] ...future.strategy.old <- future::plan("list") [15:31:46.750] options(future.plan = NULL) [15:31:46.750] Sys.unsetenv("R_FUTURE_PLAN") [15:31:46.750] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:46.750] } [15:31:46.750] ...future.workdir <- getwd() [15:31:46.750] } [15:31:46.750] ...future.oldOptions <- base::as.list(base::.Options) [15:31:46.750] ...future.oldEnvVars <- base::Sys.getenv() [15:31:46.750] } [15:31:46.750] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:46.750] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:46.750] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:46.750] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:46.750] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:46.750] future.stdout.windows.reencode = NULL, width = 80L) [15:31:46.750] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:46.750] base::names(...future.oldOptions)) [15:31:46.750] } [15:31:46.750] if (FALSE) { [15:31:46.750] } [15:31:46.750] else { [15:31:46.750] if (TRUE) { [15:31:46.750] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:46.750] open = "w") [15:31:46.750] } [15:31:46.750] else { [15:31:46.750] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:46.750] windows = "NUL", "/dev/null"), open = "w") [15:31:46.750] } [15:31:46.750] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:46.750] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:46.750] base::sink(type = "output", split = FALSE) [15:31:46.750] base::close(...future.stdout) [15:31:46.750] }, add = TRUE) [15:31:46.750] } [15:31:46.750] ...future.frame <- base::sys.nframe() [15:31:46.750] ...future.conditions <- base::list() [15:31:46.750] ...future.rng <- base::globalenv()$.Random.seed [15:31:46.750] if (FALSE) { [15:31:46.750] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:46.750] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:46.750] } [15:31:46.750] ...future.result <- base::tryCatch({ [15:31:46.750] base::withCallingHandlers({ [15:31:46.750] ...future.value <- base::withVisible(base::local({ [15:31:46.750] do.call(function(...) { [15:31:46.750] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.750] if (!identical(...future.globals.maxSize.org, [15:31:46.750] ...future.globals.maxSize)) { [15:31:46.750] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.750] on.exit(options(oopts), add = TRUE) [15:31:46.750] } [15:31:46.750] { [15:31:46.750] lapply(seq_along(...future.elements_ii), [15:31:46.750] FUN = function(jj) { [15:31:46.750] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.750] ...future.FUN(...future.X_jj, ...) [15:31:46.750] }) [15:31:46.750] } [15:31:46.750] }, args = future.call.arguments) [15:31:46.750] })) [15:31:46.750] future::FutureResult(value = ...future.value$value, [15:31:46.750] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:46.750] ...future.rng), globalenv = if (FALSE) [15:31:46.750] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:46.750] ...future.globalenv.names)) [15:31:46.750] else NULL, started = ...future.startTime, version = "1.8") [15:31:46.750] }, condition = base::local({ [15:31:46.750] c <- base::c [15:31:46.750] inherits <- base::inherits [15:31:46.750] invokeRestart <- base::invokeRestart [15:31:46.750] length <- base::length [15:31:46.750] list <- base::list [15:31:46.750] seq.int <- base::seq.int [15:31:46.750] signalCondition <- base::signalCondition [15:31:46.750] sys.calls <- base::sys.calls [15:31:46.750] `[[` <- base::`[[` [15:31:46.750] `+` <- base::`+` [15:31:46.750] `<<-` <- base::`<<-` [15:31:46.750] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:46.750] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:46.750] 3L)] [15:31:46.750] } [15:31:46.750] function(cond) { [15:31:46.750] is_error <- inherits(cond, "error") [15:31:46.750] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:46.750] NULL) [15:31:46.750] if (is_error) { [15:31:46.750] sessionInformation <- function() { [15:31:46.750] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:46.750] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:46.750] search = base::search(), system = base::Sys.info()) [15:31:46.750] } [15:31:46.750] ...future.conditions[[length(...future.conditions) + [15:31:46.750] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:46.750] cond$call), session = sessionInformation(), [15:31:46.750] timestamp = base::Sys.time(), signaled = 0L) [15:31:46.750] signalCondition(cond) [15:31:46.750] } [15:31:46.750] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:46.750] "immediateCondition"))) { [15:31:46.750] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:46.750] ...future.conditions[[length(...future.conditions) + [15:31:46.750] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:46.750] if (TRUE && !signal) { [15:31:46.750] muffleCondition <- function (cond, pattern = "^muffle") [15:31:46.750] { [15:31:46.750] inherits <- base::inherits [15:31:46.750] invokeRestart <- base::invokeRestart [15:31:46.750] is.null <- base::is.null [15:31:46.750] muffled <- FALSE [15:31:46.750] if (inherits(cond, "message")) { [15:31:46.750] muffled <- grepl(pattern, "muffleMessage") [15:31:46.750] if (muffled) [15:31:46.750] invokeRestart("muffleMessage") [15:31:46.750] } [15:31:46.750] else if (inherits(cond, "warning")) { [15:31:46.750] muffled <- grepl(pattern, "muffleWarning") [15:31:46.750] if (muffled) [15:31:46.750] invokeRestart("muffleWarning") [15:31:46.750] } [15:31:46.750] else if (inherits(cond, "condition")) { [15:31:46.750] if (!is.null(pattern)) { [15:31:46.750] computeRestarts <- base::computeRestarts [15:31:46.750] grepl <- base::grepl [15:31:46.750] restarts <- computeRestarts(cond) [15:31:46.750] for (restart in restarts) { [15:31:46.750] name <- restart$name [15:31:46.750] if (is.null(name)) [15:31:46.750] next [15:31:46.750] if (!grepl(pattern, name)) [15:31:46.750] next [15:31:46.750] invokeRestart(restart) [15:31:46.750] muffled <- TRUE [15:31:46.750] break [15:31:46.750] } [15:31:46.750] } [15:31:46.750] } [15:31:46.750] invisible(muffled) [15:31:46.750] } [15:31:46.750] muffleCondition(cond, pattern = "^muffle") [15:31:46.750] } [15:31:46.750] } [15:31:46.750] else { [15:31:46.750] if (TRUE) { [15:31:46.750] muffleCondition <- function (cond, pattern = "^muffle") [15:31:46.750] { [15:31:46.750] inherits <- base::inherits [15:31:46.750] invokeRestart <- base::invokeRestart [15:31:46.750] is.null <- base::is.null [15:31:46.750] muffled <- FALSE [15:31:46.750] if (inherits(cond, "message")) { [15:31:46.750] muffled <- grepl(pattern, "muffleMessage") [15:31:46.750] if (muffled) [15:31:46.750] invokeRestart("muffleMessage") [15:31:46.750] } [15:31:46.750] else if (inherits(cond, "warning")) { [15:31:46.750] muffled <- grepl(pattern, "muffleWarning") [15:31:46.750] if (muffled) [15:31:46.750] invokeRestart("muffleWarning") [15:31:46.750] } [15:31:46.750] else if (inherits(cond, "condition")) { [15:31:46.750] if (!is.null(pattern)) { [15:31:46.750] computeRestarts <- base::computeRestarts [15:31:46.750] grepl <- base::grepl [15:31:46.750] restarts <- computeRestarts(cond) [15:31:46.750] for (restart in restarts) { [15:31:46.750] name <- restart$name [15:31:46.750] if (is.null(name)) [15:31:46.750] next [15:31:46.750] if (!grepl(pattern, name)) [15:31:46.750] next [15:31:46.750] invokeRestart(restart) [15:31:46.750] muffled <- TRUE [15:31:46.750] break [15:31:46.750] } [15:31:46.750] } [15:31:46.750] } [15:31:46.750] invisible(muffled) [15:31:46.750] } [15:31:46.750] muffleCondition(cond, pattern = "^muffle") [15:31:46.750] } [15:31:46.750] } [15:31:46.750] } [15:31:46.750] })) [15:31:46.750] }, error = function(ex) { [15:31:46.750] base::structure(base::list(value = NULL, visible = NULL, [15:31:46.750] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:46.750] ...future.rng), started = ...future.startTime, [15:31:46.750] finished = Sys.time(), session_uuid = NA_character_, [15:31:46.750] version = "1.8"), class = "FutureResult") [15:31:46.750] }, finally = { [15:31:46.750] if (!identical(...future.workdir, getwd())) [15:31:46.750] setwd(...future.workdir) [15:31:46.750] { [15:31:46.750] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:46.750] ...future.oldOptions$nwarnings <- NULL [15:31:46.750] } [15:31:46.750] base::options(...future.oldOptions) [15:31:46.750] if (.Platform$OS.type == "windows") { [15:31:46.750] old_names <- names(...future.oldEnvVars) [15:31:46.750] envs <- base::Sys.getenv() [15:31:46.750] names <- names(envs) [15:31:46.750] common <- intersect(names, old_names) [15:31:46.750] added <- setdiff(names, old_names) [15:31:46.750] removed <- setdiff(old_names, names) [15:31:46.750] changed <- common[...future.oldEnvVars[common] != [15:31:46.750] envs[common]] [15:31:46.750] NAMES <- toupper(changed) [15:31:46.750] args <- list() [15:31:46.750] for (kk in seq_along(NAMES)) { [15:31:46.750] name <- changed[[kk]] [15:31:46.750] NAME <- NAMES[[kk]] [15:31:46.750] if (name != NAME && is.element(NAME, old_names)) [15:31:46.750] next [15:31:46.750] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:46.750] } [15:31:46.750] NAMES <- toupper(added) [15:31:46.750] for (kk in seq_along(NAMES)) { [15:31:46.750] name <- added[[kk]] [15:31:46.750] NAME <- NAMES[[kk]] [15:31:46.750] if (name != NAME && is.element(NAME, old_names)) [15:31:46.750] next [15:31:46.750] args[[name]] <- "" [15:31:46.750] } [15:31:46.750] NAMES <- toupper(removed) [15:31:46.750] for (kk in seq_along(NAMES)) { [15:31:46.750] name <- removed[[kk]] [15:31:46.750] NAME <- NAMES[[kk]] [15:31:46.750] if (name != NAME && is.element(NAME, old_names)) [15:31:46.750] next [15:31:46.750] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:46.750] } [15:31:46.750] if (length(args) > 0) [15:31:46.750] base::do.call(base::Sys.setenv, args = args) [15:31:46.750] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:46.750] } [15:31:46.750] else { [15:31:46.750] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:46.750] } [15:31:46.750] { [15:31:46.750] if (base::length(...future.futureOptionsAdded) > [15:31:46.750] 0L) { [15:31:46.750] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:46.750] base::names(opts) <- ...future.futureOptionsAdded [15:31:46.750] base::options(opts) [15:31:46.750] } [15:31:46.750] { [15:31:46.750] { [15:31:46.750] NULL [15:31:46.750] RNGkind("Mersenne-Twister") [15:31:46.750] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:46.750] inherits = FALSE) [15:31:46.750] } [15:31:46.750] options(future.plan = NULL) [15:31:46.750] if (is.na(NA_character_)) [15:31:46.750] Sys.unsetenv("R_FUTURE_PLAN") [15:31:46.750] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:46.750] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:46.750] .init = FALSE) [15:31:46.750] } [15:31:46.750] } [15:31:46.750] } [15:31:46.750] }) [15:31:46.750] if (TRUE) { [15:31:46.750] base::sink(type = "output", split = FALSE) [15:31:46.750] if (TRUE) { [15:31:46.750] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:46.750] } [15:31:46.750] else { [15:31:46.750] ...future.result["stdout"] <- base::list(NULL) [15:31:46.750] } [15:31:46.750] base::close(...future.stdout) [15:31:46.750] ...future.stdout <- NULL [15:31:46.750] } [15:31:46.750] ...future.result$conditions <- ...future.conditions [15:31:46.750] ...future.result$finished <- base::Sys.time() [15:31:46.750] ...future.result [15:31:46.750] } [15:31:46.755] assign_globals() ... [15:31:46.755] List of 5 [15:31:46.755] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:46.755] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:46.755] $ future.call.arguments :List of 2 [15:31:46.755] ..$ collapse: chr "; " [15:31:46.755] ..$ maxHead : int 3 [15:31:46.755] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.755] $ ...future.elements_ii :List of 1 [15:31:46.755] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [15:31:46.755] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [15:31:46.755] $ ...future.seeds_ii : NULL [15:31:46.755] $ ...future.globals.maxSize: NULL [15:31:46.755] - attr(*, "where")=List of 5 [15:31:46.755] ..$ ...future.FUN : [15:31:46.755] ..$ future.call.arguments : [15:31:46.755] ..$ ...future.elements_ii : [15:31:46.755] ..$ ...future.seeds_ii : [15:31:46.755] ..$ ...future.globals.maxSize: [15:31:46.755] - attr(*, "resolved")= logi FALSE [15:31:46.755] - attr(*, "total_size")= num 71456 [15:31:46.755] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.755] - attr(*, "already-done")= logi TRUE [15:31:46.769] - copied '...future.FUN' to environment [15:31:46.769] - copied 'future.call.arguments' to environment [15:31:46.770] - copied '...future.elements_ii' to environment [15:31:46.770] - copied '...future.seeds_ii' to environment [15:31:46.770] - copied '...future.globals.maxSize' to environment [15:31:46.770] assign_globals() ... done [15:31:46.772] plan(): Setting new future strategy stack: [15:31:46.772] List of future strategies: [15:31:46.772] 1. sequential: [15:31:46.772] - args: function (..., envir = parent.frame(), workers = "") [15:31:46.772] - tweaked: FALSE [15:31:46.772] - call: NULL [15:31:46.773] plan(): nbrOfWorkers() = 1 [15:31:46.775] plan(): Setting new future strategy stack: [15:31:46.776] List of future strategies: [15:31:46.776] 1. sequential: [15:31:46.776] - args: function (..., envir = parent.frame(), workers = "") [15:31:46.776] - tweaked: FALSE [15:31:46.776] - call: plan(strategy) [15:31:46.777] plan(): nbrOfWorkers() = 1 [15:31:46.777] SequentialFuture started (and completed) [15:31:46.777] - Launch lazy future ... done [15:31:46.778] run() for 'SequentialFuture' ... done [15:31:46.778] Created future: [15:31:46.778] SequentialFuture: [15:31:46.778] Label: 'future_lapply-1' [15:31:46.778] Expression: [15:31:46.778] { [15:31:46.778] do.call(function(...) { [15:31:46.778] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.778] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:46.778] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.778] on.exit(options(oopts), add = TRUE) [15:31:46.778] } [15:31:46.778] { [15:31:46.778] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:46.778] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.778] ...future.FUN(...future.X_jj, ...) [15:31:46.778] }) [15:31:46.778] } [15:31:46.778] }, args = future.call.arguments) [15:31:46.778] } [15:31:46.778] Lazy evaluation: FALSE [15:31:46.778] Asynchronous evaluation: FALSE [15:31:46.778] Local evaluation: TRUE [15:31:46.778] Environment: R_GlobalEnv [15:31:46.778] Capture standard output: TRUE [15:31:46.778] Capture condition classes: 'condition' (excluding 'nothing') [15:31:46.778] Globals: 5 objects totaling 82.61 KiB (function '...future.FUN' of 69.62 KiB, DotDotDotList 'future.call.arguments' of 168 bytes, list '...future.elements_ii' of 12.83 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:46.778] Packages: 1 packages ('future') [15:31:46.778] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:46.778] Resolved: TRUE [15:31:46.778] Value: 136 bytes of class 'list' [15:31:46.778] Early signaling: FALSE [15:31:46.778] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:46.778] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:46.781] Chunk #1 of 1 ... DONE [15:31:46.781] Launching 1 futures (chunks) ... DONE [15:31:46.781] Resolving 1 futures (chunks) ... [15:31:46.782] resolve() on list ... [15:31:46.782] recursive: 0 [15:31:46.782] length: 1 [15:31:46.782] [15:31:46.783] resolved() for 'SequentialFuture' ... [15:31:46.783] - state: 'finished' [15:31:46.783] - run: TRUE [15:31:46.784] - result: 'FutureResult' [15:31:46.784] resolved() for 'SequentialFuture' ... done [15:31:46.784] Future #1 [15:31:46.785] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:46.785] - nx: 1 [15:31:46.785] - relay: TRUE [15:31:46.786] - stdout: TRUE [15:31:46.786] - signal: TRUE [15:31:46.786] - resignal: FALSE [15:31:46.786] - force: TRUE [15:31:46.787] - relayed: [n=1] FALSE [15:31:46.787] - queued futures: [n=1] FALSE [15:31:46.787] - until=1 [15:31:46.787] - relaying element #1 [15:31:46.788] - relayed: [n=1] TRUE [15:31:46.788] - queued futures: [n=1] TRUE [15:31:46.789] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:46.789] length: 0 (resolved future 1) [15:31:46.789] Relaying remaining futures [15:31:46.789] signalConditionsASAP(NULL, pos=0) ... [15:31:46.790] - nx: 1 [15:31:46.790] - relay: TRUE [15:31:46.790] - stdout: TRUE [15:31:46.790] - signal: TRUE [15:31:46.791] - resignal: FALSE [15:31:46.791] - force: TRUE [15:31:46.791] - relayed: [n=1] TRUE [15:31:46.791] - queued futures: [n=1] TRUE - flush all [15:31:46.792] - relayed: [n=1] TRUE [15:31:46.792] - queued futures: [n=1] TRUE [15:31:46.792] signalConditionsASAP(NULL, pos=0) ... done [15:31:46.793] resolve() on list ... DONE [15:31:46.793] - Number of value chunks collected: 1 [15:31:46.793] Resolving 1 futures (chunks) ... DONE [15:31:46.794] Reducing values from 1 chunks ... [15:31:46.794] - Number of values collected after concatenation: 1 [15:31:46.794] - Number of values expected: 1 [15:31:46.795] Reducing values from 1 chunks ... DONE [15:31:46.795] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [15:31:46.797] future_lapply() ... [15:31:46.798] Number of chunks: 1 [15:31:46.799] Index remapping (attribute 'ordering'): [n = 2] 2, 1 [15:31:46.799] getGlobalsAndPackagesXApply() ... [15:31:46.799] - future.globals: TRUE [15:31:46.799] getGlobalsAndPackages() ... [15:31:46.800] Searching for globals... [15:31:46.802] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [15:31:46.803] Searching for globals ... DONE [15:31:46.803] Resolving globals: FALSE [15:31:46.804] The total size of the 1 globals is 4.85 KiB (4968 bytes) [15:31:46.804] The total size of the 1 globals exported for future expression ('FUN()') is 4.85 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (4.85 KiB of class 'function') [15:31:46.805] - globals: [1] 'FUN' [15:31:46.805] - packages: [1] 'listenv' [15:31:46.805] getGlobalsAndPackages() ... DONE [15:31:46.806] - globals found/used: [n=1] 'FUN' [15:31:46.806] - needed namespaces: [n=1] 'listenv' [15:31:46.806] Finding globals ... DONE [15:31:46.807] - use_args: TRUE [15:31:46.807] - Getting '...' globals ... [15:31:46.808] resolve() on list ... [15:31:46.808] recursive: 0 [15:31:46.808] length: 1 [15:31:46.808] elements: '...' [15:31:46.809] length: 0 (resolved future 1) [15:31:46.809] resolve() on list ... DONE [15:31:46.809] - '...' content: [n=0] [15:31:46.810] List of 1 [15:31:46.810] $ ...: list() [15:31:46.810] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.810] - attr(*, "where")=List of 1 [15:31:46.810] ..$ ...: [15:31:46.810] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.810] - attr(*, "resolved")= logi TRUE [15:31:46.810] - attr(*, "total_size")= num NA [15:31:46.818] - Getting '...' globals ... DONE [15:31:46.818] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:46.819] List of 2 [15:31:46.819] $ ...future.FUN:function (x, ...) [15:31:46.819] $ ... : list() [15:31:46.819] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.819] - attr(*, "where")=List of 2 [15:31:46.819] ..$ ...future.FUN: [15:31:46.819] ..$ ... : [15:31:46.819] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.819] - attr(*, "resolved")= logi FALSE [15:31:46.819] - attr(*, "total_size")= num 4968 [15:31:46.825] Packages to be attached in all futures: [n=1] 'listenv' [15:31:46.825] getGlobalsAndPackagesXApply() ... DONE [15:31:46.826] Number of futures (= number of chunks): 1 [15:31:46.826] Launching 1 futures (chunks) ... [15:31:46.826] Chunk #1 of 1 ... [15:31:46.826] - Finding globals in 'X' for chunk #1 ... [15:31:46.827] getGlobalsAndPackages() ... [15:31:46.827] Searching for globals... [15:31:46.828] [15:31:46.829] Searching for globals ... DONE [15:31:46.829] - globals: [0] [15:31:46.829] getGlobalsAndPackages() ... DONE [15:31:46.829] + additional globals found: [n=0] [15:31:46.830] + additional namespaces needed: [n=0] [15:31:46.830] - Finding globals in 'X' for chunk #1 ... DONE [15:31:46.830] - seeds: [15:31:46.831] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.831] getGlobalsAndPackages() ... [15:31:46.831] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.832] Resolving globals: FALSE [15:31:46.832] Tweak future expression to call with '...' arguments ... [15:31:46.832] { [15:31:46.832] do.call(function(...) { [15:31:46.832] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.832] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:46.832] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.832] on.exit(options(oopts), add = TRUE) [15:31:46.832] } [15:31:46.832] { [15:31:46.832] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:46.832] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.832] ...future.FUN(...future.X_jj, ...) [15:31:46.832] }) [15:31:46.832] } [15:31:46.832] }, args = future.call.arguments) [15:31:46.832] } [15:31:46.833] Tweak future expression to call with '...' arguments ... DONE [15:31:46.834] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.834] - packages: [1] 'listenv' [15:31:46.834] getGlobalsAndPackages() ... DONE [15:31:46.835] run() for 'Future' ... [15:31:46.835] - state: 'created' [15:31:46.836] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:46.836] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:46.837] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:46.837] - Field: 'label' [15:31:46.837] - Field: 'local' [15:31:46.838] - Field: 'owner' [15:31:46.838] - Field: 'envir' [15:31:46.838] - Field: 'packages' [15:31:46.839] - Field: 'gc' [15:31:46.839] - Field: 'conditions' [15:31:46.839] - Field: 'expr' [15:31:46.840] - Field: 'uuid' [15:31:46.840] - Field: 'seed' [15:31:46.840] - Field: 'version' [15:31:46.841] - Field: 'result' [15:31:46.841] - Field: 'asynchronous' [15:31:46.841] - Field: 'calls' [15:31:46.841] - Field: 'globals' [15:31:46.842] - Field: 'stdout' [15:31:46.842] - Field: 'earlySignal' [15:31:46.842] - Field: 'lazy' [15:31:46.843] - Field: 'state' [15:31:46.843] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:46.843] - Launch lazy future ... [15:31:46.844] Packages needed by the future expression (n = 1): 'listenv' [15:31:46.844] Packages needed by future strategies (n = 0): [15:31:46.845] { [15:31:46.845] { [15:31:46.845] { [15:31:46.845] ...future.startTime <- base::Sys.time() [15:31:46.845] { [15:31:46.845] { [15:31:46.845] { [15:31:46.845] { [15:31:46.845] base::local({ [15:31:46.845] has_future <- base::requireNamespace("future", [15:31:46.845] quietly = TRUE) [15:31:46.845] if (has_future) { [15:31:46.845] ns <- base::getNamespace("future") [15:31:46.845] version <- ns[[".package"]][["version"]] [15:31:46.845] if (is.null(version)) [15:31:46.845] version <- utils::packageVersion("future") [15:31:46.845] } [15:31:46.845] else { [15:31:46.845] version <- NULL [15:31:46.845] } [15:31:46.845] if (!has_future || version < "1.8.0") { [15:31:46.845] info <- base::c(r_version = base::gsub("R version ", [15:31:46.845] "", base::R.version$version.string), [15:31:46.845] platform = base::sprintf("%s (%s-bit)", [15:31:46.845] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:46.845] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:46.845] "release", "version")], collapse = " "), [15:31:46.845] hostname = base::Sys.info()[["nodename"]]) [15:31:46.845] info <- base::sprintf("%s: %s", base::names(info), [15:31:46.845] info) [15:31:46.845] info <- base::paste(info, collapse = "; ") [15:31:46.845] if (!has_future) { [15:31:46.845] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:46.845] info) [15:31:46.845] } [15:31:46.845] else { [15:31:46.845] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:46.845] info, version) [15:31:46.845] } [15:31:46.845] base::stop(msg) [15:31:46.845] } [15:31:46.845] }) [15:31:46.845] } [15:31:46.845] base::local({ [15:31:46.845] for (pkg in "listenv") { [15:31:46.845] base::loadNamespace(pkg) [15:31:46.845] base::library(pkg, character.only = TRUE) [15:31:46.845] } [15:31:46.845] }) [15:31:46.845] } [15:31:46.845] ...future.strategy.old <- future::plan("list") [15:31:46.845] options(future.plan = NULL) [15:31:46.845] Sys.unsetenv("R_FUTURE_PLAN") [15:31:46.845] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:46.845] } [15:31:46.845] ...future.workdir <- getwd() [15:31:46.845] } [15:31:46.845] ...future.oldOptions <- base::as.list(base::.Options) [15:31:46.845] ...future.oldEnvVars <- base::Sys.getenv() [15:31:46.845] } [15:31:46.845] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:46.845] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:46.845] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:46.845] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:46.845] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:46.845] future.stdout.windows.reencode = NULL, width = 80L) [15:31:46.845] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:46.845] base::names(...future.oldOptions)) [15:31:46.845] } [15:31:46.845] if (FALSE) { [15:31:46.845] } [15:31:46.845] else { [15:31:46.845] if (TRUE) { [15:31:46.845] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:46.845] open = "w") [15:31:46.845] } [15:31:46.845] else { [15:31:46.845] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:46.845] windows = "NUL", "/dev/null"), open = "w") [15:31:46.845] } [15:31:46.845] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:46.845] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:46.845] base::sink(type = "output", split = FALSE) [15:31:46.845] base::close(...future.stdout) [15:31:46.845] }, add = TRUE) [15:31:46.845] } [15:31:46.845] ...future.frame <- base::sys.nframe() [15:31:46.845] ...future.conditions <- base::list() [15:31:46.845] ...future.rng <- base::globalenv()$.Random.seed [15:31:46.845] if (FALSE) { [15:31:46.845] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:46.845] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:46.845] } [15:31:46.845] ...future.result <- base::tryCatch({ [15:31:46.845] base::withCallingHandlers({ [15:31:46.845] ...future.value <- base::withVisible(base::local({ [15:31:46.845] do.call(function(...) { [15:31:46.845] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.845] if (!identical(...future.globals.maxSize.org, [15:31:46.845] ...future.globals.maxSize)) { [15:31:46.845] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.845] on.exit(options(oopts), add = TRUE) [15:31:46.845] } [15:31:46.845] { [15:31:46.845] lapply(seq_along(...future.elements_ii), [15:31:46.845] FUN = function(jj) { [15:31:46.845] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.845] ...future.FUN(...future.X_jj, ...) [15:31:46.845] }) [15:31:46.845] } [15:31:46.845] }, args = future.call.arguments) [15:31:46.845] })) [15:31:46.845] future::FutureResult(value = ...future.value$value, [15:31:46.845] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:46.845] ...future.rng), globalenv = if (FALSE) [15:31:46.845] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:46.845] ...future.globalenv.names)) [15:31:46.845] else NULL, started = ...future.startTime, version = "1.8") [15:31:46.845] }, condition = base::local({ [15:31:46.845] c <- base::c [15:31:46.845] inherits <- base::inherits [15:31:46.845] invokeRestart <- base::invokeRestart [15:31:46.845] length <- base::length [15:31:46.845] list <- base::list [15:31:46.845] seq.int <- base::seq.int [15:31:46.845] signalCondition <- base::signalCondition [15:31:46.845] sys.calls <- base::sys.calls [15:31:46.845] `[[` <- base::`[[` [15:31:46.845] `+` <- base::`+` [15:31:46.845] `<<-` <- base::`<<-` [15:31:46.845] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:46.845] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:46.845] 3L)] [15:31:46.845] } [15:31:46.845] function(cond) { [15:31:46.845] is_error <- inherits(cond, "error") [15:31:46.845] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:46.845] NULL) [15:31:46.845] if (is_error) { [15:31:46.845] sessionInformation <- function() { [15:31:46.845] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:46.845] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:46.845] search = base::search(), system = base::Sys.info()) [15:31:46.845] } [15:31:46.845] ...future.conditions[[length(...future.conditions) + [15:31:46.845] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:46.845] cond$call), session = sessionInformation(), [15:31:46.845] timestamp = base::Sys.time(), signaled = 0L) [15:31:46.845] signalCondition(cond) [15:31:46.845] } [15:31:46.845] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:46.845] "immediateCondition"))) { [15:31:46.845] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:46.845] ...future.conditions[[length(...future.conditions) + [15:31:46.845] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:46.845] if (TRUE && !signal) { [15:31:46.845] muffleCondition <- function (cond, pattern = "^muffle") [15:31:46.845] { [15:31:46.845] inherits <- base::inherits [15:31:46.845] invokeRestart <- base::invokeRestart [15:31:46.845] is.null <- base::is.null [15:31:46.845] muffled <- FALSE [15:31:46.845] if (inherits(cond, "message")) { [15:31:46.845] muffled <- grepl(pattern, "muffleMessage") [15:31:46.845] if (muffled) [15:31:46.845] invokeRestart("muffleMessage") [15:31:46.845] } [15:31:46.845] else if (inherits(cond, "warning")) { [15:31:46.845] muffled <- grepl(pattern, "muffleWarning") [15:31:46.845] if (muffled) [15:31:46.845] invokeRestart("muffleWarning") [15:31:46.845] } [15:31:46.845] else if (inherits(cond, "condition")) { [15:31:46.845] if (!is.null(pattern)) { [15:31:46.845] computeRestarts <- base::computeRestarts [15:31:46.845] grepl <- base::grepl [15:31:46.845] restarts <- computeRestarts(cond) [15:31:46.845] for (restart in restarts) { [15:31:46.845] name <- restart$name [15:31:46.845] if (is.null(name)) [15:31:46.845] next [15:31:46.845] if (!grepl(pattern, name)) [15:31:46.845] next [15:31:46.845] invokeRestart(restart) [15:31:46.845] muffled <- TRUE [15:31:46.845] break [15:31:46.845] } [15:31:46.845] } [15:31:46.845] } [15:31:46.845] invisible(muffled) [15:31:46.845] } [15:31:46.845] muffleCondition(cond, pattern = "^muffle") [15:31:46.845] } [15:31:46.845] } [15:31:46.845] else { [15:31:46.845] if (TRUE) { [15:31:46.845] muffleCondition <- function (cond, pattern = "^muffle") [15:31:46.845] { [15:31:46.845] inherits <- base::inherits [15:31:46.845] invokeRestart <- base::invokeRestart [15:31:46.845] is.null <- base::is.null [15:31:46.845] muffled <- FALSE [15:31:46.845] if (inherits(cond, "message")) { [15:31:46.845] muffled <- grepl(pattern, "muffleMessage") [15:31:46.845] if (muffled) [15:31:46.845] invokeRestart("muffleMessage") [15:31:46.845] } [15:31:46.845] else if (inherits(cond, "warning")) { [15:31:46.845] muffled <- grepl(pattern, "muffleWarning") [15:31:46.845] if (muffled) [15:31:46.845] invokeRestart("muffleWarning") [15:31:46.845] } [15:31:46.845] else if (inherits(cond, "condition")) { [15:31:46.845] if (!is.null(pattern)) { [15:31:46.845] computeRestarts <- base::computeRestarts [15:31:46.845] grepl <- base::grepl [15:31:46.845] restarts <- computeRestarts(cond) [15:31:46.845] for (restart in restarts) { [15:31:46.845] name <- restart$name [15:31:46.845] if (is.null(name)) [15:31:46.845] next [15:31:46.845] if (!grepl(pattern, name)) [15:31:46.845] next [15:31:46.845] invokeRestart(restart) [15:31:46.845] muffled <- TRUE [15:31:46.845] break [15:31:46.845] } [15:31:46.845] } [15:31:46.845] } [15:31:46.845] invisible(muffled) [15:31:46.845] } [15:31:46.845] muffleCondition(cond, pattern = "^muffle") [15:31:46.845] } [15:31:46.845] } [15:31:46.845] } [15:31:46.845] })) [15:31:46.845] }, error = function(ex) { [15:31:46.845] base::structure(base::list(value = NULL, visible = NULL, [15:31:46.845] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:46.845] ...future.rng), started = ...future.startTime, [15:31:46.845] finished = Sys.time(), session_uuid = NA_character_, [15:31:46.845] version = "1.8"), class = "FutureResult") [15:31:46.845] }, finally = { [15:31:46.845] if (!identical(...future.workdir, getwd())) [15:31:46.845] setwd(...future.workdir) [15:31:46.845] { [15:31:46.845] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:46.845] ...future.oldOptions$nwarnings <- NULL [15:31:46.845] } [15:31:46.845] base::options(...future.oldOptions) [15:31:46.845] if (.Platform$OS.type == "windows") { [15:31:46.845] old_names <- names(...future.oldEnvVars) [15:31:46.845] envs <- base::Sys.getenv() [15:31:46.845] names <- names(envs) [15:31:46.845] common <- intersect(names, old_names) [15:31:46.845] added <- setdiff(names, old_names) [15:31:46.845] removed <- setdiff(old_names, names) [15:31:46.845] changed <- common[...future.oldEnvVars[common] != [15:31:46.845] envs[common]] [15:31:46.845] NAMES <- toupper(changed) [15:31:46.845] args <- list() [15:31:46.845] for (kk in seq_along(NAMES)) { [15:31:46.845] name <- changed[[kk]] [15:31:46.845] NAME <- NAMES[[kk]] [15:31:46.845] if (name != NAME && is.element(NAME, old_names)) [15:31:46.845] next [15:31:46.845] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:46.845] } [15:31:46.845] NAMES <- toupper(added) [15:31:46.845] for (kk in seq_along(NAMES)) { [15:31:46.845] name <- added[[kk]] [15:31:46.845] NAME <- NAMES[[kk]] [15:31:46.845] if (name != NAME && is.element(NAME, old_names)) [15:31:46.845] next [15:31:46.845] args[[name]] <- "" [15:31:46.845] } [15:31:46.845] NAMES <- toupper(removed) [15:31:46.845] for (kk in seq_along(NAMES)) { [15:31:46.845] name <- removed[[kk]] [15:31:46.845] NAME <- NAMES[[kk]] [15:31:46.845] if (name != NAME && is.element(NAME, old_names)) [15:31:46.845] next [15:31:46.845] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:46.845] } [15:31:46.845] if (length(args) > 0) [15:31:46.845] base::do.call(base::Sys.setenv, args = args) [15:31:46.845] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:46.845] } [15:31:46.845] else { [15:31:46.845] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:46.845] } [15:31:46.845] { [15:31:46.845] if (base::length(...future.futureOptionsAdded) > [15:31:46.845] 0L) { [15:31:46.845] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:46.845] base::names(opts) <- ...future.futureOptionsAdded [15:31:46.845] base::options(opts) [15:31:46.845] } [15:31:46.845] { [15:31:46.845] { [15:31:46.845] NULL [15:31:46.845] RNGkind("Mersenne-Twister") [15:31:46.845] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:46.845] inherits = FALSE) [15:31:46.845] } [15:31:46.845] options(future.plan = NULL) [15:31:46.845] if (is.na(NA_character_)) [15:31:46.845] Sys.unsetenv("R_FUTURE_PLAN") [15:31:46.845] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:46.845] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:46.845] .init = FALSE) [15:31:46.845] } [15:31:46.845] } [15:31:46.845] } [15:31:46.845] }) [15:31:46.845] if (TRUE) { [15:31:46.845] base::sink(type = "output", split = FALSE) [15:31:46.845] if (TRUE) { [15:31:46.845] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:46.845] } [15:31:46.845] else { [15:31:46.845] ...future.result["stdout"] <- base::list(NULL) [15:31:46.845] } [15:31:46.845] base::close(...future.stdout) [15:31:46.845] ...future.stdout <- NULL [15:31:46.845] } [15:31:46.845] ...future.result$conditions <- ...future.conditions [15:31:46.845] ...future.result$finished <- base::Sys.time() [15:31:46.845] ...future.result [15:31:46.845] } [15:31:46.853] assign_globals() ... [15:31:46.853] List of 5 [15:31:46.853] $ ...future.FUN :function (x, ...) [15:31:46.853] $ future.call.arguments : list() [15:31:46.853] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.853] $ ...future.elements_ii :List of 2 [15:31:46.853] ..$ b:Classes 'listenv', 'environment' [15:31:46.853] ..$ a:Classes 'listenv', 'environment' [15:31:46.853] $ ...future.seeds_ii : NULL [15:31:46.853] $ ...future.globals.maxSize: NULL [15:31:46.853] - attr(*, "where")=List of 5 [15:31:46.853] ..$ ...future.FUN : [15:31:46.853] ..$ future.call.arguments : [15:31:46.853] ..$ ...future.elements_ii : [15:31:46.853] ..$ ...future.seeds_ii : [15:31:46.853] ..$ ...future.globals.maxSize: [15:31:46.853] - attr(*, "resolved")= logi FALSE [15:31:46.853] - attr(*, "total_size")= num 4968 [15:31:46.853] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.853] - attr(*, "already-done")= logi TRUE [15:31:46.867] - copied '...future.FUN' to environment [15:31:46.867] - copied 'future.call.arguments' to environment [15:31:46.867] - copied '...future.elements_ii' to environment [15:31:46.868] - copied '...future.seeds_ii' to environment [15:31:46.868] - copied '...future.globals.maxSize' to environment [15:31:46.868] assign_globals() ... done [15:31:46.870] plan(): Setting new future strategy stack: [15:31:46.870] List of future strategies: [15:31:46.870] 1. sequential: [15:31:46.870] - args: function (..., envir = parent.frame(), workers = "") [15:31:46.870] - tweaked: FALSE [15:31:46.870] - call: NULL [15:31:46.871] plan(): nbrOfWorkers() = 1 [15:31:46.873] plan(): Setting new future strategy stack: [15:31:46.873] List of future strategies: [15:31:46.873] 1. sequential: [15:31:46.873] - args: function (..., envir = parent.frame(), workers = "") [15:31:46.873] - tweaked: FALSE [15:31:46.873] - call: plan(strategy) [15:31:46.875] plan(): nbrOfWorkers() = 1 [15:31:46.875] SequentialFuture started (and completed) [15:31:46.875] - Launch lazy future ... done [15:31:46.876] run() for 'SequentialFuture' ... done [15:31:46.876] Created future: [15:31:46.876] SequentialFuture: [15:31:46.876] Label: 'future_lapply-1' [15:31:46.876] Expression: [15:31:46.876] { [15:31:46.876] do.call(function(...) { [15:31:46.876] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.876] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:46.876] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.876] on.exit(options(oopts), add = TRUE) [15:31:46.876] } [15:31:46.876] { [15:31:46.876] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:46.876] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.876] ...future.FUN(...future.X_jj, ...) [15:31:46.876] }) [15:31:46.876] } [15:31:46.876] }, args = future.call.arguments) [15:31:46.876] } [15:31:46.876] Lazy evaluation: FALSE [15:31:46.876] Asynchronous evaluation: FALSE [15:31:46.876] Local evaluation: TRUE [15:31:46.876] Environment: R_GlobalEnv [15:31:46.876] Capture standard output: TRUE [15:31:46.876] Capture condition classes: 'condition' (excluding 'nothing') [15:31:46.876] Globals: 5 objects totaling 17.90 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 13.05 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:46.876] Packages: 1 packages ('listenv') [15:31:46.876] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:46.876] Resolved: TRUE [15:31:46.876] Value: 800 bytes of class 'list' [15:31:46.876] Early signaling: FALSE [15:31:46.876] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:46.876] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:46.879] Chunk #1 of 1 ... DONE [15:31:46.879] Launching 1 futures (chunks) ... DONE [15:31:46.879] Resolving 1 futures (chunks) ... [15:31:46.880] resolve() on list ... [15:31:46.880] recursive: 0 [15:31:46.880] length: 1 [15:31:46.880] [15:31:46.881] resolved() for 'SequentialFuture' ... [15:31:46.881] - state: 'finished' [15:31:46.881] - run: TRUE [15:31:46.881] - result: 'FutureResult' [15:31:46.882] resolved() for 'SequentialFuture' ... done [15:31:46.882] Future #1 [15:31:46.882] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:46.883] - nx: 1 [15:31:46.883] - relay: TRUE [15:31:46.883] - stdout: TRUE [15:31:46.883] - signal: TRUE [15:31:46.884] - resignal: FALSE [15:31:46.884] - force: TRUE [15:31:46.884] - relayed: [n=1] FALSE [15:31:46.885] - queued futures: [n=1] FALSE [15:31:46.885] - until=1 [15:31:46.885] - relaying element #1 [15:31:46.886] - relayed: [n=1] TRUE [15:31:46.886] - queued futures: [n=1] TRUE [15:31:46.886] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:46.886] length: 0 (resolved future 1) [15:31:46.887] Relaying remaining futures [15:31:46.887] signalConditionsASAP(NULL, pos=0) ... [15:31:46.887] - nx: 1 [15:31:46.888] - relay: TRUE [15:31:46.888] - stdout: TRUE [15:31:46.888] - signal: TRUE [15:31:46.888] - resignal: FALSE [15:31:46.889] - force: TRUE [15:31:46.889] - relayed: [n=1] TRUE [15:31:46.889] - queued futures: [n=1] TRUE - flush all [15:31:46.890] - relayed: [n=1] TRUE [15:31:46.890] - queued futures: [n=1] TRUE [15:31:46.890] signalConditionsASAP(NULL, pos=0) ... done [15:31:46.890] resolve() on list ... DONE [15:31:46.891] - Number of value chunks collected: 1 [15:31:46.891] Resolving 1 futures (chunks) ... DONE [15:31:46.891] Reducing values from 1 chunks ... [15:31:46.892] - Number of values collected after concatenation: 2 [15:31:46.892] - Number of values expected: 2 [15:31:46.892] Reverse index remapping (attribute 'ordering'): [n = 2] 2, 1 [15:31:46.892] Reducing values from 1 chunks ... DONE [15:31:46.893] 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, ...) ... [15:31:46.896] future_lapply() ... [15:31:46.898] Number of chunks: 1 [15:31:46.898] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [15:31:46.898] getGlobalsAndPackagesXApply() ... [15:31:46.899] - future.globals: TRUE [15:31:46.899] getGlobalsAndPackages() ... [15:31:46.899] Searching for globals... [15:31:46.902] - globals found: [2] 'FUN', '.Internal' [15:31:46.902] Searching for globals ... DONE [15:31:46.902] Resolving globals: FALSE [15:31:46.903] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:46.904] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:46.904] - globals: [1] 'FUN' [15:31:46.904] [15:31:46.904] getGlobalsAndPackages() ... DONE [15:31:46.905] - globals found/used: [n=1] 'FUN' [15:31:46.905] - needed namespaces: [n=0] [15:31:46.905] Finding globals ... DONE [15:31:46.906] - use_args: TRUE [15:31:46.906] - Getting '...' globals ... [15:31:46.907] resolve() on list ... [15:31:46.907] recursive: 0 [15:31:46.907] length: 1 [15:31:46.908] elements: '...' [15:31:46.908] length: 0 (resolved future 1) [15:31:46.908] resolve() on list ... DONE [15:31:46.909] - '...' content: [n=1] 'length' [15:31:46.909] List of 1 [15:31:46.909] $ ...:List of 1 [15:31:46.909] ..$ length: int 2 [15:31:46.909] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.909] - attr(*, "where")=List of 1 [15:31:46.909] ..$ ...: [15:31:46.909] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.909] - attr(*, "resolved")= logi TRUE [15:31:46.909] - attr(*, "total_size")= num NA [15:31:46.918] - Getting '...' globals ... DONE [15:31:46.919] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:46.919] List of 2 [15:31:46.919] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:46.919] $ ... :List of 1 [15:31:46.919] ..$ length: int 2 [15:31:46.919] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.919] - attr(*, "where")=List of 2 [15:31:46.919] ..$ ...future.FUN: [15:31:46.919] ..$ ... : [15:31:46.919] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.919] - attr(*, "resolved")= logi FALSE [15:31:46.919] - attr(*, "total_size")= num 2240 [15:31:46.925] Packages to be attached in all futures: [n=0] [15:31:46.926] getGlobalsAndPackagesXApply() ... DONE [15:31:46.926] Number of futures (= number of chunks): 1 [15:31:46.926] Launching 1 futures (chunks) ... [15:31:46.927] Chunk #1 of 1 ... [15:31:46.927] - Finding globals in 'X' for chunk #1 ... [15:31:46.927] getGlobalsAndPackages() ... [15:31:46.928] Searching for globals... [15:31:46.928] [15:31:46.928] Searching for globals ... DONE [15:31:46.929] - globals: [0] [15:31:46.929] getGlobalsAndPackages() ... DONE [15:31:46.929] + additional globals found: [n=0] [15:31:46.930] + additional namespaces needed: [n=0] [15:31:46.930] - Finding globals in 'X' for chunk #1 ... DONE [15:31:46.930] - seeds: [15:31:46.930] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.931] getGlobalsAndPackages() ... [15:31:46.931] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.931] Resolving globals: FALSE [15:31:46.932] Tweak future expression to call with '...' arguments ... [15:31:46.932] { [15:31:46.932] do.call(function(...) { [15:31:46.932] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.932] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:46.932] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.932] on.exit(options(oopts), add = TRUE) [15:31:46.932] } [15:31:46.932] { [15:31:46.932] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:46.932] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.932] ...future.FUN(...future.X_jj, ...) [15:31:46.932] }) [15:31:46.932] } [15:31:46.932] }, args = future.call.arguments) [15:31:46.932] } [15:31:46.933] Tweak future expression to call with '...' arguments ... DONE [15:31:46.933] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:46.934] [15:31:46.934] getGlobalsAndPackages() ... DONE [15:31:46.935] run() for 'Future' ... [15:31:46.935] - state: 'created' [15:31:46.935] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:46.936] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:46.936] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:46.937] - Field: 'label' [15:31:46.937] - Field: 'local' [15:31:46.937] - Field: 'owner' [15:31:46.938] - Field: 'envir' [15:31:46.938] - Field: 'packages' [15:31:46.938] - Field: 'gc' [15:31:46.938] - Field: 'conditions' [15:31:46.939] - Field: 'expr' [15:31:46.939] - Field: 'uuid' [15:31:46.939] - Field: 'seed' [15:31:46.940] - Field: 'version' [15:31:46.940] - Field: 'result' [15:31:46.940] - Field: 'asynchronous' [15:31:46.941] - Field: 'calls' [15:31:46.941] - Field: 'globals' [15:31:46.941] - Field: 'stdout' [15:31:46.942] - Field: 'earlySignal' [15:31:46.942] - Field: 'lazy' [15:31:46.942] - Field: 'state' [15:31:46.943] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:46.943] - Launch lazy future ... [15:31:46.943] Packages needed by the future expression (n = 0): [15:31:46.944] Packages needed by future strategies (n = 0): [15:31:46.945] { [15:31:46.945] { [15:31:46.945] { [15:31:46.945] ...future.startTime <- base::Sys.time() [15:31:46.945] { [15:31:46.945] { [15:31:46.945] { [15:31:46.945] base::local({ [15:31:46.945] has_future <- base::requireNamespace("future", [15:31:46.945] quietly = TRUE) [15:31:46.945] if (has_future) { [15:31:46.945] ns <- base::getNamespace("future") [15:31:46.945] version <- ns[[".package"]][["version"]] [15:31:46.945] if (is.null(version)) [15:31:46.945] version <- utils::packageVersion("future") [15:31:46.945] } [15:31:46.945] else { [15:31:46.945] version <- NULL [15:31:46.945] } [15:31:46.945] if (!has_future || version < "1.8.0") { [15:31:46.945] info <- base::c(r_version = base::gsub("R version ", [15:31:46.945] "", base::R.version$version.string), [15:31:46.945] platform = base::sprintf("%s (%s-bit)", [15:31:46.945] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:46.945] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:46.945] "release", "version")], collapse = " "), [15:31:46.945] hostname = base::Sys.info()[["nodename"]]) [15:31:46.945] info <- base::sprintf("%s: %s", base::names(info), [15:31:46.945] info) [15:31:46.945] info <- base::paste(info, collapse = "; ") [15:31:46.945] if (!has_future) { [15:31:46.945] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:46.945] info) [15:31:46.945] } [15:31:46.945] else { [15:31:46.945] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:46.945] info, version) [15:31:46.945] } [15:31:46.945] base::stop(msg) [15:31:46.945] } [15:31:46.945] }) [15:31:46.945] } [15:31:46.945] ...future.strategy.old <- future::plan("list") [15:31:46.945] options(future.plan = NULL) [15:31:46.945] Sys.unsetenv("R_FUTURE_PLAN") [15:31:46.945] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:46.945] } [15:31:46.945] ...future.workdir <- getwd() [15:31:46.945] } [15:31:46.945] ...future.oldOptions <- base::as.list(base::.Options) [15:31:46.945] ...future.oldEnvVars <- base::Sys.getenv() [15:31:46.945] } [15:31:46.945] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:46.945] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:46.945] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:46.945] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:46.945] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:46.945] future.stdout.windows.reencode = NULL, width = 80L) [15:31:46.945] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:46.945] base::names(...future.oldOptions)) [15:31:46.945] } [15:31:46.945] if (FALSE) { [15:31:46.945] } [15:31:46.945] else { [15:31:46.945] if (TRUE) { [15:31:46.945] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:46.945] open = "w") [15:31:46.945] } [15:31:46.945] else { [15:31:46.945] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:46.945] windows = "NUL", "/dev/null"), open = "w") [15:31:46.945] } [15:31:46.945] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:46.945] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:46.945] base::sink(type = "output", split = FALSE) [15:31:46.945] base::close(...future.stdout) [15:31:46.945] }, add = TRUE) [15:31:46.945] } [15:31:46.945] ...future.frame <- base::sys.nframe() [15:31:46.945] ...future.conditions <- base::list() [15:31:46.945] ...future.rng <- base::globalenv()$.Random.seed [15:31:46.945] if (FALSE) { [15:31:46.945] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:46.945] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:46.945] } [15:31:46.945] ...future.result <- base::tryCatch({ [15:31:46.945] base::withCallingHandlers({ [15:31:46.945] ...future.value <- base::withVisible(base::local({ [15:31:46.945] do.call(function(...) { [15:31:46.945] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.945] if (!identical(...future.globals.maxSize.org, [15:31:46.945] ...future.globals.maxSize)) { [15:31:46.945] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.945] on.exit(options(oopts), add = TRUE) [15:31:46.945] } [15:31:46.945] { [15:31:46.945] lapply(seq_along(...future.elements_ii), [15:31:46.945] FUN = function(jj) { [15:31:46.945] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.945] ...future.FUN(...future.X_jj, ...) [15:31:46.945] }) [15:31:46.945] } [15:31:46.945] }, args = future.call.arguments) [15:31:46.945] })) [15:31:46.945] future::FutureResult(value = ...future.value$value, [15:31:46.945] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:46.945] ...future.rng), globalenv = if (FALSE) [15:31:46.945] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:46.945] ...future.globalenv.names)) [15:31:46.945] else NULL, started = ...future.startTime, version = "1.8") [15:31:46.945] }, condition = base::local({ [15:31:46.945] c <- base::c [15:31:46.945] inherits <- base::inherits [15:31:46.945] invokeRestart <- base::invokeRestart [15:31:46.945] length <- base::length [15:31:46.945] list <- base::list [15:31:46.945] seq.int <- base::seq.int [15:31:46.945] signalCondition <- base::signalCondition [15:31:46.945] sys.calls <- base::sys.calls [15:31:46.945] `[[` <- base::`[[` [15:31:46.945] `+` <- base::`+` [15:31:46.945] `<<-` <- base::`<<-` [15:31:46.945] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:46.945] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:46.945] 3L)] [15:31:46.945] } [15:31:46.945] function(cond) { [15:31:46.945] is_error <- inherits(cond, "error") [15:31:46.945] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:46.945] NULL) [15:31:46.945] if (is_error) { [15:31:46.945] sessionInformation <- function() { [15:31:46.945] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:46.945] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:46.945] search = base::search(), system = base::Sys.info()) [15:31:46.945] } [15:31:46.945] ...future.conditions[[length(...future.conditions) + [15:31:46.945] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:46.945] cond$call), session = sessionInformation(), [15:31:46.945] timestamp = base::Sys.time(), signaled = 0L) [15:31:46.945] signalCondition(cond) [15:31:46.945] } [15:31:46.945] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:46.945] "immediateCondition"))) { [15:31:46.945] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:46.945] ...future.conditions[[length(...future.conditions) + [15:31:46.945] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:46.945] if (TRUE && !signal) { [15:31:46.945] muffleCondition <- function (cond, pattern = "^muffle") [15:31:46.945] { [15:31:46.945] inherits <- base::inherits [15:31:46.945] invokeRestart <- base::invokeRestart [15:31:46.945] is.null <- base::is.null [15:31:46.945] muffled <- FALSE [15:31:46.945] if (inherits(cond, "message")) { [15:31:46.945] muffled <- grepl(pattern, "muffleMessage") [15:31:46.945] if (muffled) [15:31:46.945] invokeRestart("muffleMessage") [15:31:46.945] } [15:31:46.945] else if (inherits(cond, "warning")) { [15:31:46.945] muffled <- grepl(pattern, "muffleWarning") [15:31:46.945] if (muffled) [15:31:46.945] invokeRestart("muffleWarning") [15:31:46.945] } [15:31:46.945] else if (inherits(cond, "condition")) { [15:31:46.945] if (!is.null(pattern)) { [15:31:46.945] computeRestarts <- base::computeRestarts [15:31:46.945] grepl <- base::grepl [15:31:46.945] restarts <- computeRestarts(cond) [15:31:46.945] for (restart in restarts) { [15:31:46.945] name <- restart$name [15:31:46.945] if (is.null(name)) [15:31:46.945] next [15:31:46.945] if (!grepl(pattern, name)) [15:31:46.945] next [15:31:46.945] invokeRestart(restart) [15:31:46.945] muffled <- TRUE [15:31:46.945] break [15:31:46.945] } [15:31:46.945] } [15:31:46.945] } [15:31:46.945] invisible(muffled) [15:31:46.945] } [15:31:46.945] muffleCondition(cond, pattern = "^muffle") [15:31:46.945] } [15:31:46.945] } [15:31:46.945] else { [15:31:46.945] if (TRUE) { [15:31:46.945] muffleCondition <- function (cond, pattern = "^muffle") [15:31:46.945] { [15:31:46.945] inherits <- base::inherits [15:31:46.945] invokeRestart <- base::invokeRestart [15:31:46.945] is.null <- base::is.null [15:31:46.945] muffled <- FALSE [15:31:46.945] if (inherits(cond, "message")) { [15:31:46.945] muffled <- grepl(pattern, "muffleMessage") [15:31:46.945] if (muffled) [15:31:46.945] invokeRestart("muffleMessage") [15:31:46.945] } [15:31:46.945] else if (inherits(cond, "warning")) { [15:31:46.945] muffled <- grepl(pattern, "muffleWarning") [15:31:46.945] if (muffled) [15:31:46.945] invokeRestart("muffleWarning") [15:31:46.945] } [15:31:46.945] else if (inherits(cond, "condition")) { [15:31:46.945] if (!is.null(pattern)) { [15:31:46.945] computeRestarts <- base::computeRestarts [15:31:46.945] grepl <- base::grepl [15:31:46.945] restarts <- computeRestarts(cond) [15:31:46.945] for (restart in restarts) { [15:31:46.945] name <- restart$name [15:31:46.945] if (is.null(name)) [15:31:46.945] next [15:31:46.945] if (!grepl(pattern, name)) [15:31:46.945] next [15:31:46.945] invokeRestart(restart) [15:31:46.945] muffled <- TRUE [15:31:46.945] break [15:31:46.945] } [15:31:46.945] } [15:31:46.945] } [15:31:46.945] invisible(muffled) [15:31:46.945] } [15:31:46.945] muffleCondition(cond, pattern = "^muffle") [15:31:46.945] } [15:31:46.945] } [15:31:46.945] } [15:31:46.945] })) [15:31:46.945] }, error = function(ex) { [15:31:46.945] base::structure(base::list(value = NULL, visible = NULL, [15:31:46.945] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:46.945] ...future.rng), started = ...future.startTime, [15:31:46.945] finished = Sys.time(), session_uuid = NA_character_, [15:31:46.945] version = "1.8"), class = "FutureResult") [15:31:46.945] }, finally = { [15:31:46.945] if (!identical(...future.workdir, getwd())) [15:31:46.945] setwd(...future.workdir) [15:31:46.945] { [15:31:46.945] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:46.945] ...future.oldOptions$nwarnings <- NULL [15:31:46.945] } [15:31:46.945] base::options(...future.oldOptions) [15:31:46.945] if (.Platform$OS.type == "windows") { [15:31:46.945] old_names <- names(...future.oldEnvVars) [15:31:46.945] envs <- base::Sys.getenv() [15:31:46.945] names <- names(envs) [15:31:46.945] common <- intersect(names, old_names) [15:31:46.945] added <- setdiff(names, old_names) [15:31:46.945] removed <- setdiff(old_names, names) [15:31:46.945] changed <- common[...future.oldEnvVars[common] != [15:31:46.945] envs[common]] [15:31:46.945] NAMES <- toupper(changed) [15:31:46.945] args <- list() [15:31:46.945] for (kk in seq_along(NAMES)) { [15:31:46.945] name <- changed[[kk]] [15:31:46.945] NAME <- NAMES[[kk]] [15:31:46.945] if (name != NAME && is.element(NAME, old_names)) [15:31:46.945] next [15:31:46.945] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:46.945] } [15:31:46.945] NAMES <- toupper(added) [15:31:46.945] for (kk in seq_along(NAMES)) { [15:31:46.945] name <- added[[kk]] [15:31:46.945] NAME <- NAMES[[kk]] [15:31:46.945] if (name != NAME && is.element(NAME, old_names)) [15:31:46.945] next [15:31:46.945] args[[name]] <- "" [15:31:46.945] } [15:31:46.945] NAMES <- toupper(removed) [15:31:46.945] for (kk in seq_along(NAMES)) { [15:31:46.945] name <- removed[[kk]] [15:31:46.945] NAME <- NAMES[[kk]] [15:31:46.945] if (name != NAME && is.element(NAME, old_names)) [15:31:46.945] next [15:31:46.945] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:46.945] } [15:31:46.945] if (length(args) > 0) [15:31:46.945] base::do.call(base::Sys.setenv, args = args) [15:31:46.945] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:46.945] } [15:31:46.945] else { [15:31:46.945] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:46.945] } [15:31:46.945] { [15:31:46.945] if (base::length(...future.futureOptionsAdded) > [15:31:46.945] 0L) { [15:31:46.945] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:46.945] base::names(opts) <- ...future.futureOptionsAdded [15:31:46.945] base::options(opts) [15:31:46.945] } [15:31:46.945] { [15:31:46.945] { [15:31:46.945] NULL [15:31:46.945] RNGkind("Mersenne-Twister") [15:31:46.945] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:46.945] inherits = FALSE) [15:31:46.945] } [15:31:46.945] options(future.plan = NULL) [15:31:46.945] if (is.na(NA_character_)) [15:31:46.945] Sys.unsetenv("R_FUTURE_PLAN") [15:31:46.945] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:46.945] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:46.945] .init = FALSE) [15:31:46.945] } [15:31:46.945] } [15:31:46.945] } [15:31:46.945] }) [15:31:46.945] if (TRUE) { [15:31:46.945] base::sink(type = "output", split = FALSE) [15:31:46.945] if (TRUE) { [15:31:46.945] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:46.945] } [15:31:46.945] else { [15:31:46.945] ...future.result["stdout"] <- base::list(NULL) [15:31:46.945] } [15:31:46.945] base::close(...future.stdout) [15:31:46.945] ...future.stdout <- NULL [15:31:46.945] } [15:31:46.945] ...future.result$conditions <- ...future.conditions [15:31:46.945] ...future.result$finished <- base::Sys.time() [15:31:46.945] ...future.result [15:31:46.945] } [15:31:46.951] assign_globals() ... [15:31:46.952] List of 5 [15:31:46.952] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:46.952] $ future.call.arguments :List of 1 [15:31:46.952] ..$ length: int 2 [15:31:46.952] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.952] $ ...future.elements_ii :List of 4 [15:31:46.952] ..$ c: chr "list" [15:31:46.952] ..$ c: chr "character" [15:31:46.952] ..$ b: chr "numeric" [15:31:46.952] ..$ a: chr "integer" [15:31:46.952] $ ...future.seeds_ii : NULL [15:31:46.952] $ ...future.globals.maxSize: NULL [15:31:46.952] - attr(*, "where")=List of 5 [15:31:46.952] ..$ ...future.FUN : [15:31:46.952] ..$ future.call.arguments : [15:31:46.952] ..$ ...future.elements_ii : [15:31:46.952] ..$ ...future.seeds_ii : [15:31:46.952] ..$ ...future.globals.maxSize: [15:31:46.952] - attr(*, "resolved")= logi FALSE [15:31:46.952] - attr(*, "total_size")= num 2240 [15:31:46.952] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.952] - attr(*, "already-done")= logi TRUE [15:31:46.967] - copied '...future.FUN' to environment [15:31:46.967] - copied 'future.call.arguments' to environment [15:31:46.968] - copied '...future.elements_ii' to environment [15:31:46.968] - copied '...future.seeds_ii' to environment [15:31:46.968] - copied '...future.globals.maxSize' to environment [15:31:46.968] assign_globals() ... done [15:31:46.969] plan(): Setting new future strategy stack: [15:31:46.969] List of future strategies: [15:31:46.969] 1. sequential: [15:31:46.969] - args: function (..., envir = parent.frame(), workers = "") [15:31:46.969] - tweaked: FALSE [15:31:46.969] - call: NULL [15:31:46.969] plan(): nbrOfWorkers() = 1 [15:31:46.971] plan(): Setting new future strategy stack: [15:31:46.971] List of future strategies: [15:31:46.971] 1. sequential: [15:31:46.971] - args: function (..., envir = parent.frame(), workers = "") [15:31:46.971] - tweaked: FALSE [15:31:46.971] - call: plan(strategy) [15:31:46.972] plan(): nbrOfWorkers() = 1 [15:31:46.972] SequentialFuture started (and completed) [15:31:46.972] - Launch lazy future ... done [15:31:46.972] run() for 'SequentialFuture' ... done [15:31:46.973] Created future: [15:31:46.973] SequentialFuture: [15:31:46.973] Label: 'future_lapply-1' [15:31:46.973] Expression: [15:31:46.973] { [15:31:46.973] do.call(function(...) { [15:31:46.973] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:46.973] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:46.973] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:46.973] on.exit(options(oopts), add = TRUE) [15:31:46.973] } [15:31:46.973] { [15:31:46.973] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:46.973] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:46.973] ...future.FUN(...future.X_jj, ...) [15:31:46.973] }) [15:31:46.973] } [15:31:46.973] }, args = future.call.arguments) [15:31:46.973] } [15:31:46.973] Lazy evaluation: FALSE [15:31:46.973] Asynchronous evaluation: FALSE [15:31:46.973] Local evaluation: TRUE [15:31:46.973] Environment: R_GlobalEnv [15:31:46.973] Capture standard output: TRUE [15:31:46.973] Capture condition classes: 'condition' (excluding 'nothing') [15:31:46.973] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:46.973] Packages: [15:31:46.973] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:46.973] Resolved: TRUE [15:31:46.973] Value: 240 bytes of class 'list' [15:31:46.973] Early signaling: FALSE [15:31:46.973] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:46.973] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:46.974] Chunk #1 of 1 ... DONE [15:31:46.974] Launching 1 futures (chunks) ... DONE [15:31:46.975] Resolving 1 futures (chunks) ... [15:31:46.975] resolve() on list ... [15:31:46.975] recursive: 0 [15:31:46.975] length: 1 [15:31:46.975] [15:31:46.975] resolved() for 'SequentialFuture' ... [15:31:46.976] - state: 'finished' [15:31:46.976] - run: TRUE [15:31:46.976] - result: 'FutureResult' [15:31:46.976] resolved() for 'SequentialFuture' ... done [15:31:46.976] Future #1 [15:31:46.977] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:46.977] - nx: 1 [15:31:46.977] - relay: TRUE [15:31:46.977] - stdout: TRUE [15:31:46.977] - signal: TRUE [15:31:46.978] - resignal: FALSE [15:31:46.978] - force: TRUE [15:31:46.978] - relayed: [n=1] FALSE [15:31:46.978] - queued futures: [n=1] FALSE [15:31:46.978] - until=1 [15:31:46.978] - relaying element #1 [15:31:46.979] - relayed: [n=1] TRUE [15:31:46.979] - queued futures: [n=1] TRUE [15:31:46.979] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:46.979] length: 0 (resolved future 1) [15:31:46.979] Relaying remaining futures [15:31:46.980] signalConditionsASAP(NULL, pos=0) ... [15:31:46.980] - nx: 1 [15:31:46.980] - relay: TRUE [15:31:46.980] - stdout: TRUE [15:31:46.980] - signal: TRUE [15:31:46.980] - resignal: FALSE [15:31:46.980] - force: TRUE [15:31:46.981] - relayed: [n=1] TRUE [15:31:46.981] - queued futures: [n=1] TRUE - flush all [15:31:46.981] - relayed: [n=1] TRUE [15:31:46.981] - queued futures: [n=1] TRUE [15:31:46.981] signalConditionsASAP(NULL, pos=0) ... done [15:31:46.982] resolve() on list ... DONE [15:31:46.982] - Number of value chunks collected: 1 [15:31:46.982] Resolving 1 futures (chunks) ... DONE [15:31:46.982] Reducing values from 1 chunks ... [15:31:46.982] - Number of values collected after concatenation: 4 [15:31:46.983] - Number of values expected: 4 [15:31:46.983] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [15:31:46.983] Reducing values from 1 chunks ... DONE [15:31:46.983] 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 [15:31:46.986] future_lapply() ... [15:31:46.987] Number of chunks: 1 [15:31:46.987] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [15:31:46.987] getGlobalsAndPackagesXApply() ... [15:31:46.988] - future.globals: TRUE [15:31:46.988] getGlobalsAndPackages() ... [15:31:46.988] Searching for globals... [15:31:46.992] - globals found: [2] 'FUN', '.Internal' [15:31:46.992] Searching for globals ... DONE [15:31:46.992] Resolving globals: FALSE [15:31:46.993] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:46.993] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:46.993] - globals: [1] 'FUN' [15:31:46.994] [15:31:46.994] getGlobalsAndPackages() ... DONE [15:31:46.994] - globals found/used: [n=1] 'FUN' [15:31:46.994] - needed namespaces: [n=0] [15:31:46.994] Finding globals ... DONE [15:31:46.995] - use_args: TRUE [15:31:46.995] - Getting '...' globals ... [15:31:46.995] resolve() on list ... [15:31:46.995] recursive: 0 [15:31:46.996] length: 1 [15:31:46.996] elements: '...' [15:31:46.996] length: 0 (resolved future 1) [15:31:46.996] resolve() on list ... DONE [15:31:46.996] - '...' content: [n=1] 'length' [15:31:46.997] List of 1 [15:31:46.997] $ ...:List of 1 [15:31:46.997] ..$ length: int 2 [15:31:46.997] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:46.997] - attr(*, "where")=List of 1 [15:31:46.997] ..$ ...: [15:31:46.997] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:46.997] - attr(*, "resolved")= logi TRUE [15:31:46.997] - attr(*, "total_size")= num NA [15:31:47.001] - Getting '...' globals ... DONE [15:31:47.001] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:47.001] List of 2 [15:31:47.001] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:47.001] $ ... :List of 1 [15:31:47.001] ..$ length: int 2 [15:31:47.001] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:47.001] - attr(*, "where")=List of 2 [15:31:47.001] ..$ ...future.FUN: [15:31:47.001] ..$ ... : [15:31:47.001] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:47.001] - attr(*, "resolved")= logi FALSE [15:31:47.001] - attr(*, "total_size")= num 2240 [15:31:47.005] Packages to be attached in all futures: [n=0] [15:31:47.005] getGlobalsAndPackagesXApply() ... DONE [15:31:47.006] Number of futures (= number of chunks): 1 [15:31:47.006] Launching 1 futures (chunks) ... [15:31:47.006] Chunk #1 of 1 ... [15:31:47.006] - Finding globals in 'X' for chunk #1 ... [15:31:47.006] getGlobalsAndPackages() ... [15:31:47.007] Searching for globals... [15:31:47.007] [15:31:47.007] Searching for globals ... DONE [15:31:47.007] - globals: [0] [15:31:47.007] getGlobalsAndPackages() ... DONE [15:31:47.008] + additional globals found: [n=0] [15:31:47.008] + additional namespaces needed: [n=0] [15:31:47.008] - Finding globals in 'X' for chunk #1 ... DONE [15:31:47.008] - seeds: [15:31:47.008] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:47.009] getGlobalsAndPackages() ... [15:31:47.009] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:47.009] Resolving globals: FALSE [15:31:47.009] Tweak future expression to call with '...' arguments ... [15:31:47.009] { [15:31:47.009] do.call(function(...) { [15:31:47.009] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:47.009] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:47.009] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:47.009] on.exit(options(oopts), add = TRUE) [15:31:47.009] } [15:31:47.009] { [15:31:47.009] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:47.009] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:47.009] ...future.FUN(...future.X_jj, ...) [15:31:47.009] }) [15:31:47.009] } [15:31:47.009] }, args = future.call.arguments) [15:31:47.009] } [15:31:47.010] Tweak future expression to call with '...' arguments ... DONE [15:31:47.010] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:47.011] [15:31:47.011] getGlobalsAndPackages() ... DONE [15:31:47.011] run() for 'Future' ... [15:31:47.011] - state: 'created' [15:31:47.012] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:47.012] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:47.012] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:47.012] - Field: 'label' [15:31:47.013] - Field: 'local' [15:31:47.013] - Field: 'owner' [15:31:47.013] - Field: 'envir' [15:31:47.013] - Field: 'packages' [15:31:47.013] - Field: 'gc' [15:31:47.013] - Field: 'conditions' [15:31:47.014] - Field: 'expr' [15:31:47.014] - Field: 'uuid' [15:31:47.014] - Field: 'seed' [15:31:47.014] - Field: 'version' [15:31:47.014] - Field: 'result' [15:31:47.015] - Field: 'asynchronous' [15:31:47.015] - Field: 'calls' [15:31:47.015] - Field: 'globals' [15:31:47.015] - Field: 'stdout' [15:31:47.016] - Field: 'earlySignal' [15:31:47.016] - Field: 'lazy' [15:31:47.016] - Field: 'state' [15:31:47.016] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:47.018] - Launch lazy future ... [15:31:47.019] Packages needed by the future expression (n = 0): [15:31:47.019] Packages needed by future strategies (n = 0): [15:31:47.019] { [15:31:47.019] { [15:31:47.019] { [15:31:47.019] ...future.startTime <- base::Sys.time() [15:31:47.019] { [15:31:47.019] { [15:31:47.019] { [15:31:47.019] base::local({ [15:31:47.019] has_future <- base::requireNamespace("future", [15:31:47.019] quietly = TRUE) [15:31:47.019] if (has_future) { [15:31:47.019] ns <- base::getNamespace("future") [15:31:47.019] version <- ns[[".package"]][["version"]] [15:31:47.019] if (is.null(version)) [15:31:47.019] version <- utils::packageVersion("future") [15:31:47.019] } [15:31:47.019] else { [15:31:47.019] version <- NULL [15:31:47.019] } [15:31:47.019] if (!has_future || version < "1.8.0") { [15:31:47.019] info <- base::c(r_version = base::gsub("R version ", [15:31:47.019] "", base::R.version$version.string), [15:31:47.019] platform = base::sprintf("%s (%s-bit)", [15:31:47.019] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:47.019] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:47.019] "release", "version")], collapse = " "), [15:31:47.019] hostname = base::Sys.info()[["nodename"]]) [15:31:47.019] info <- base::sprintf("%s: %s", base::names(info), [15:31:47.019] info) [15:31:47.019] info <- base::paste(info, collapse = "; ") [15:31:47.019] if (!has_future) { [15:31:47.019] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:47.019] info) [15:31:47.019] } [15:31:47.019] else { [15:31:47.019] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:47.019] info, version) [15:31:47.019] } [15:31:47.019] base::stop(msg) [15:31:47.019] } [15:31:47.019] }) [15:31:47.019] } [15:31:47.019] ...future.strategy.old <- future::plan("list") [15:31:47.019] options(future.plan = NULL) [15:31:47.019] Sys.unsetenv("R_FUTURE_PLAN") [15:31:47.019] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:47.019] } [15:31:47.019] ...future.workdir <- getwd() [15:31:47.019] } [15:31:47.019] ...future.oldOptions <- base::as.list(base::.Options) [15:31:47.019] ...future.oldEnvVars <- base::Sys.getenv() [15:31:47.019] } [15:31:47.019] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:47.019] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:47.019] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:47.019] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:47.019] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:47.019] future.stdout.windows.reencode = NULL, width = 80L) [15:31:47.019] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:47.019] base::names(...future.oldOptions)) [15:31:47.019] } [15:31:47.019] if (FALSE) { [15:31:47.019] } [15:31:47.019] else { [15:31:47.019] if (TRUE) { [15:31:47.019] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:47.019] open = "w") [15:31:47.019] } [15:31:47.019] else { [15:31:47.019] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:47.019] windows = "NUL", "/dev/null"), open = "w") [15:31:47.019] } [15:31:47.019] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:47.019] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:47.019] base::sink(type = "output", split = FALSE) [15:31:47.019] base::close(...future.stdout) [15:31:47.019] }, add = TRUE) [15:31:47.019] } [15:31:47.019] ...future.frame <- base::sys.nframe() [15:31:47.019] ...future.conditions <- base::list() [15:31:47.019] ...future.rng <- base::globalenv()$.Random.seed [15:31:47.019] if (FALSE) { [15:31:47.019] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:47.019] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:47.019] } [15:31:47.019] ...future.result <- base::tryCatch({ [15:31:47.019] base::withCallingHandlers({ [15:31:47.019] ...future.value <- base::withVisible(base::local({ [15:31:47.019] do.call(function(...) { [15:31:47.019] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:47.019] if (!identical(...future.globals.maxSize.org, [15:31:47.019] ...future.globals.maxSize)) { [15:31:47.019] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:47.019] on.exit(options(oopts), add = TRUE) [15:31:47.019] } [15:31:47.019] { [15:31:47.019] lapply(seq_along(...future.elements_ii), [15:31:47.019] FUN = function(jj) { [15:31:47.019] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:47.019] ...future.FUN(...future.X_jj, ...) [15:31:47.019] }) [15:31:47.019] } [15:31:47.019] }, args = future.call.arguments) [15:31:47.019] })) [15:31:47.019] future::FutureResult(value = ...future.value$value, [15:31:47.019] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:47.019] ...future.rng), globalenv = if (FALSE) [15:31:47.019] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:47.019] ...future.globalenv.names)) [15:31:47.019] else NULL, started = ...future.startTime, version = "1.8") [15:31:47.019] }, condition = base::local({ [15:31:47.019] c <- base::c [15:31:47.019] inherits <- base::inherits [15:31:47.019] invokeRestart <- base::invokeRestart [15:31:47.019] length <- base::length [15:31:47.019] list <- base::list [15:31:47.019] seq.int <- base::seq.int [15:31:47.019] signalCondition <- base::signalCondition [15:31:47.019] sys.calls <- base::sys.calls [15:31:47.019] `[[` <- base::`[[` [15:31:47.019] `+` <- base::`+` [15:31:47.019] `<<-` <- base::`<<-` [15:31:47.019] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:47.019] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:47.019] 3L)] [15:31:47.019] } [15:31:47.019] function(cond) { [15:31:47.019] is_error <- inherits(cond, "error") [15:31:47.019] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:47.019] NULL) [15:31:47.019] if (is_error) { [15:31:47.019] sessionInformation <- function() { [15:31:47.019] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:47.019] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:47.019] search = base::search(), system = base::Sys.info()) [15:31:47.019] } [15:31:47.019] ...future.conditions[[length(...future.conditions) + [15:31:47.019] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:47.019] cond$call), session = sessionInformation(), [15:31:47.019] timestamp = base::Sys.time(), signaled = 0L) [15:31:47.019] signalCondition(cond) [15:31:47.019] } [15:31:47.019] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:47.019] "immediateCondition"))) { [15:31:47.019] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:47.019] ...future.conditions[[length(...future.conditions) + [15:31:47.019] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:47.019] if (TRUE && !signal) { [15:31:47.019] muffleCondition <- function (cond, pattern = "^muffle") [15:31:47.019] { [15:31:47.019] inherits <- base::inherits [15:31:47.019] invokeRestart <- base::invokeRestart [15:31:47.019] is.null <- base::is.null [15:31:47.019] muffled <- FALSE [15:31:47.019] if (inherits(cond, "message")) { [15:31:47.019] muffled <- grepl(pattern, "muffleMessage") [15:31:47.019] if (muffled) [15:31:47.019] invokeRestart("muffleMessage") [15:31:47.019] } [15:31:47.019] else if (inherits(cond, "warning")) { [15:31:47.019] muffled <- grepl(pattern, "muffleWarning") [15:31:47.019] if (muffled) [15:31:47.019] invokeRestart("muffleWarning") [15:31:47.019] } [15:31:47.019] else if (inherits(cond, "condition")) { [15:31:47.019] if (!is.null(pattern)) { [15:31:47.019] computeRestarts <- base::computeRestarts [15:31:47.019] grepl <- base::grepl [15:31:47.019] restarts <- computeRestarts(cond) [15:31:47.019] for (restart in restarts) { [15:31:47.019] name <- restart$name [15:31:47.019] if (is.null(name)) [15:31:47.019] next [15:31:47.019] if (!grepl(pattern, name)) [15:31:47.019] next [15:31:47.019] invokeRestart(restart) [15:31:47.019] muffled <- TRUE [15:31:47.019] break [15:31:47.019] } [15:31:47.019] } [15:31:47.019] } [15:31:47.019] invisible(muffled) [15:31:47.019] } [15:31:47.019] muffleCondition(cond, pattern = "^muffle") [15:31:47.019] } [15:31:47.019] } [15:31:47.019] else { [15:31:47.019] if (TRUE) { [15:31:47.019] muffleCondition <- function (cond, pattern = "^muffle") [15:31:47.019] { [15:31:47.019] inherits <- base::inherits [15:31:47.019] invokeRestart <- base::invokeRestart [15:31:47.019] is.null <- base::is.null [15:31:47.019] muffled <- FALSE [15:31:47.019] if (inherits(cond, "message")) { [15:31:47.019] muffled <- grepl(pattern, "muffleMessage") [15:31:47.019] if (muffled) [15:31:47.019] invokeRestart("muffleMessage") [15:31:47.019] } [15:31:47.019] else if (inherits(cond, "warning")) { [15:31:47.019] muffled <- grepl(pattern, "muffleWarning") [15:31:47.019] if (muffled) [15:31:47.019] invokeRestart("muffleWarning") [15:31:47.019] } [15:31:47.019] else if (inherits(cond, "condition")) { [15:31:47.019] if (!is.null(pattern)) { [15:31:47.019] computeRestarts <- base::computeRestarts [15:31:47.019] grepl <- base::grepl [15:31:47.019] restarts <- computeRestarts(cond) [15:31:47.019] for (restart in restarts) { [15:31:47.019] name <- restart$name [15:31:47.019] if (is.null(name)) [15:31:47.019] next [15:31:47.019] if (!grepl(pattern, name)) [15:31:47.019] next [15:31:47.019] invokeRestart(restart) [15:31:47.019] muffled <- TRUE [15:31:47.019] break [15:31:47.019] } [15:31:47.019] } [15:31:47.019] } [15:31:47.019] invisible(muffled) [15:31:47.019] } [15:31:47.019] muffleCondition(cond, pattern = "^muffle") [15:31:47.019] } [15:31:47.019] } [15:31:47.019] } [15:31:47.019] })) [15:31:47.019] }, error = function(ex) { [15:31:47.019] base::structure(base::list(value = NULL, visible = NULL, [15:31:47.019] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:47.019] ...future.rng), started = ...future.startTime, [15:31:47.019] finished = Sys.time(), session_uuid = NA_character_, [15:31:47.019] version = "1.8"), class = "FutureResult") [15:31:47.019] }, finally = { [15:31:47.019] if (!identical(...future.workdir, getwd())) [15:31:47.019] setwd(...future.workdir) [15:31:47.019] { [15:31:47.019] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:47.019] ...future.oldOptions$nwarnings <- NULL [15:31:47.019] } [15:31:47.019] base::options(...future.oldOptions) [15:31:47.019] if (.Platform$OS.type == "windows") { [15:31:47.019] old_names <- names(...future.oldEnvVars) [15:31:47.019] envs <- base::Sys.getenv() [15:31:47.019] names <- names(envs) [15:31:47.019] common <- intersect(names, old_names) [15:31:47.019] added <- setdiff(names, old_names) [15:31:47.019] removed <- setdiff(old_names, names) [15:31:47.019] changed <- common[...future.oldEnvVars[common] != [15:31:47.019] envs[common]] [15:31:47.019] NAMES <- toupper(changed) [15:31:47.019] args <- list() [15:31:47.019] for (kk in seq_along(NAMES)) { [15:31:47.019] name <- changed[[kk]] [15:31:47.019] NAME <- NAMES[[kk]] [15:31:47.019] if (name != NAME && is.element(NAME, old_names)) [15:31:47.019] next [15:31:47.019] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:47.019] } [15:31:47.019] NAMES <- toupper(added) [15:31:47.019] for (kk in seq_along(NAMES)) { [15:31:47.019] name <- added[[kk]] [15:31:47.019] NAME <- NAMES[[kk]] [15:31:47.019] if (name != NAME && is.element(NAME, old_names)) [15:31:47.019] next [15:31:47.019] args[[name]] <- "" [15:31:47.019] } [15:31:47.019] NAMES <- toupper(removed) [15:31:47.019] for (kk in seq_along(NAMES)) { [15:31:47.019] name <- removed[[kk]] [15:31:47.019] NAME <- NAMES[[kk]] [15:31:47.019] if (name != NAME && is.element(NAME, old_names)) [15:31:47.019] next [15:31:47.019] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:47.019] } [15:31:47.019] if (length(args) > 0) [15:31:47.019] base::do.call(base::Sys.setenv, args = args) [15:31:47.019] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:47.019] } [15:31:47.019] else { [15:31:47.019] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:47.019] } [15:31:47.019] { [15:31:47.019] if (base::length(...future.futureOptionsAdded) > [15:31:47.019] 0L) { [15:31:47.019] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:47.019] base::names(opts) <- ...future.futureOptionsAdded [15:31:47.019] base::options(opts) [15:31:47.019] } [15:31:47.019] { [15:31:47.019] { [15:31:47.019] NULL [15:31:47.019] RNGkind("Mersenne-Twister") [15:31:47.019] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:47.019] inherits = FALSE) [15:31:47.019] } [15:31:47.019] options(future.plan = NULL) [15:31:47.019] if (is.na(NA_character_)) [15:31:47.019] Sys.unsetenv("R_FUTURE_PLAN") [15:31:47.019] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:47.019] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:47.019] .init = FALSE) [15:31:47.019] } [15:31:47.019] } [15:31:47.019] } [15:31:47.019] }) [15:31:47.019] if (TRUE) { [15:31:47.019] base::sink(type = "output", split = FALSE) [15:31:47.019] if (TRUE) { [15:31:47.019] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:47.019] } [15:31:47.019] else { [15:31:47.019] ...future.result["stdout"] <- base::list(NULL) [15:31:47.019] } [15:31:47.019] base::close(...future.stdout) [15:31:47.019] ...future.stdout <- NULL [15:31:47.019] } [15:31:47.019] ...future.result$conditions <- ...future.conditions [15:31:47.019] ...future.result$finished <- base::Sys.time() [15:31:47.019] ...future.result [15:31:47.019] } [15:31:47.024] assign_globals() ... [15:31:47.024] List of 5 [15:31:47.024] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:47.024] $ future.call.arguments :List of 1 [15:31:47.024] ..$ length: int 2 [15:31:47.024] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:47.024] $ ...future.elements_ii :List of 4 [15:31:47.024] ..$ c: chr "list" [15:31:47.024] ..$ c: chr "character" [15:31:47.024] ..$ b: chr "numeric" [15:31:47.024] ..$ a: chr "integer" [15:31:47.024] $ ...future.seeds_ii : NULL [15:31:47.024] $ ...future.globals.maxSize: NULL [15:31:47.024] - attr(*, "where")=List of 5 [15:31:47.024] ..$ ...future.FUN : [15:31:47.024] ..$ future.call.arguments : [15:31:47.024] ..$ ...future.elements_ii : [15:31:47.024] ..$ ...future.seeds_ii : [15:31:47.024] ..$ ...future.globals.maxSize: [15:31:47.024] - attr(*, "resolved")= logi FALSE [15:31:47.024] - attr(*, "total_size")= num 2240 [15:31:47.024] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:47.024] - attr(*, "already-done")= logi TRUE [15:31:47.033] - copied '...future.FUN' to environment [15:31:47.033] - copied 'future.call.arguments' to environment [15:31:47.033] - copied '...future.elements_ii' to environment [15:31:47.033] - copied '...future.seeds_ii' to environment [15:31:47.034] - copied '...future.globals.maxSize' to environment [15:31:47.034] assign_globals() ... done [15:31:47.035] plan(): Setting new future strategy stack: [15:31:47.035] List of future strategies: [15:31:47.035] 1. sequential: [15:31:47.035] - args: function (..., envir = parent.frame(), workers = "") [15:31:47.035] - tweaked: FALSE [15:31:47.035] - call: NULL [15:31:47.036] plan(): nbrOfWorkers() = 1 [15:31:47.038] plan(): Setting new future strategy stack: [15:31:47.038] List of future strategies: [15:31:47.038] 1. sequential: [15:31:47.038] - args: function (..., envir = parent.frame(), workers = "") [15:31:47.038] - tweaked: FALSE [15:31:47.038] - call: plan(strategy) [15:31:47.039] plan(): nbrOfWorkers() = 1 [15:31:47.039] SequentialFuture started (and completed) [15:31:47.039] - Launch lazy future ... done [15:31:47.040] run() for 'SequentialFuture' ... done [15:31:47.040] Created future: [15:31:47.040] SequentialFuture: [15:31:47.040] Label: 'future_lapply-1' [15:31:47.040] Expression: [15:31:47.040] { [15:31:47.040] do.call(function(...) { [15:31:47.040] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:47.040] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:47.040] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:47.040] on.exit(options(oopts), add = TRUE) [15:31:47.040] } [15:31:47.040] { [15:31:47.040] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:47.040] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:47.040] ...future.FUN(...future.X_jj, ...) [15:31:47.040] }) [15:31:47.040] } [15:31:47.040] }, args = future.call.arguments) [15:31:47.040] } [15:31:47.040] Lazy evaluation: FALSE [15:31:47.040] Asynchronous evaluation: FALSE [15:31:47.040] Local evaluation: TRUE [15:31:47.040] Environment: R_GlobalEnv [15:31:47.040] Capture standard output: TRUE [15:31:47.040] Capture condition classes: 'condition' (excluding 'nothing') [15:31:47.040] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:47.040] Packages: [15:31:47.040] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:47.040] Resolved: TRUE [15:31:47.040] Value: 240 bytes of class 'list' [15:31:47.040] Early signaling: FALSE [15:31:47.040] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:47.040] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:47.042] Chunk #1 of 1 ... DONE [15:31:47.043] Launching 1 futures (chunks) ... DONE [15:31:47.043] Resolving 1 futures (chunks) ... [15:31:47.043] resolve() on list ... [15:31:47.043] recursive: 0 [15:31:47.044] length: 1 [15:31:47.044] [15:31:47.044] resolved() for 'SequentialFuture' ... [15:31:47.044] - state: 'finished' [15:31:47.045] - run: TRUE [15:31:47.045] - result: 'FutureResult' [15:31:47.045] resolved() for 'SequentialFuture' ... done [15:31:47.046] Future #1 [15:31:47.046] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:47.046] - nx: 1 [15:31:47.046] - relay: TRUE [15:31:47.047] - stdout: TRUE [15:31:47.047] - signal: TRUE [15:31:47.047] - resignal: FALSE [15:31:47.047] - force: TRUE [15:31:47.048] - relayed: [n=1] FALSE [15:31:47.048] - queued futures: [n=1] FALSE [15:31:47.048] - until=1 [15:31:47.048] - relaying element #1 [15:31:47.049] - relayed: [n=1] TRUE [15:31:47.049] - queued futures: [n=1] TRUE [15:31:47.049] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:47.050] length: 0 (resolved future 1) [15:31:47.050] Relaying remaining futures [15:31:47.050] signalConditionsASAP(NULL, pos=0) ... [15:31:47.050] - nx: 1 [15:31:47.050] - relay: TRUE [15:31:47.051] - stdout: TRUE [15:31:47.051] - signal: TRUE [15:31:47.051] - resignal: FALSE [15:31:47.051] - force: TRUE [15:31:47.052] - relayed: [n=1] TRUE [15:31:47.052] - queued futures: [n=1] TRUE - flush all [15:31:47.052] - relayed: [n=1] TRUE [15:31:47.053] - queued futures: [n=1] TRUE [15:31:47.053] signalConditionsASAP(NULL, pos=0) ... done [15:31:47.053] resolve() on list ... DONE [15:31:47.053] - Number of value chunks collected: 1 [15:31:47.054] Resolving 1 futures (chunks) ... DONE [15:31:47.054] Reducing values from 1 chunks ... [15:31:47.054] - Number of values collected after concatenation: 4 [15:31:47.057] - Number of values expected: 4 [15:31:47.058] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [15:31:47.058] Reducing values from 1 chunks ... DONE [15:31:47.058] 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, ...) ... [15:31:47.063] future_lapply() ... [15:31:47.065] Number of chunks: 1 [15:31:47.065] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [15:31:47.066] getGlobalsAndPackagesXApply() ... [15:31:47.067] - future.globals: TRUE [15:31:47.067] getGlobalsAndPackages() ... [15:31:47.067] Searching for globals... [15:31:47.070] - globals found: [2] 'FUN', '.Internal' [15:31:47.070] Searching for globals ... DONE [15:31:47.070] Resolving globals: FALSE [15:31:47.071] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:47.071] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:47.072] - globals: [1] 'FUN' [15:31:47.072] [15:31:47.072] getGlobalsAndPackages() ... DONE [15:31:47.072] - globals found/used: [n=1] 'FUN' [15:31:47.072] - needed namespaces: [n=0] [15:31:47.073] Finding globals ... DONE [15:31:47.073] - use_args: TRUE [15:31:47.073] - Getting '...' globals ... [15:31:47.074] resolve() on list ... [15:31:47.074] recursive: 0 [15:31:47.075] length: 1 [15:31:47.075] elements: '...' [15:31:47.075] length: 0 (resolved future 1) [15:31:47.076] resolve() on list ... DONE [15:31:47.076] - '...' content: [n=1] 'length' [15:31:47.076] List of 1 [15:31:47.076] $ ...:List of 1 [15:31:47.076] ..$ length: int 2 [15:31:47.076] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:47.076] - attr(*, "where")=List of 1 [15:31:47.076] ..$ ...: [15:31:47.076] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:47.076] - attr(*, "resolved")= logi TRUE [15:31:47.076] - attr(*, "total_size")= num NA [15:31:47.084] - Getting '...' globals ... DONE [15:31:47.085] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:47.085] List of 2 [15:31:47.085] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:47.085] $ ... :List of 1 [15:31:47.085] ..$ length: int 2 [15:31:47.085] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:47.085] - attr(*, "where")=List of 2 [15:31:47.085] ..$ ...future.FUN: [15:31:47.085] ..$ ... : [15:31:47.085] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:47.085] - attr(*, "resolved")= logi FALSE [15:31:47.085] - attr(*, "total_size")= num 2240 [15:31:47.092] Packages to be attached in all futures: [n=0] [15:31:47.092] getGlobalsAndPackagesXApply() ... DONE [15:31:47.093] Number of futures (= number of chunks): 1 [15:31:47.093] Launching 1 futures (chunks) ... [15:31:47.094] Chunk #1 of 1 ... [15:31:47.094] - Finding globals in 'X' for chunk #1 ... [15:31:47.094] getGlobalsAndPackages() ... [15:31:47.095] Searching for globals... [15:31:47.095] [15:31:47.096] Searching for globals ... DONE [15:31:47.096] - globals: [0] [15:31:47.096] getGlobalsAndPackages() ... DONE [15:31:47.097] + additional globals found: [n=0] [15:31:47.097] + additional namespaces needed: [n=0] [15:31:47.104] - Finding globals in 'X' for chunk #1 ... DONE [15:31:47.104] - seeds: [15:31:47.104] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:47.105] getGlobalsAndPackages() ... [15:31:47.105] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:47.106] Resolving globals: FALSE [15:31:47.106] Tweak future expression to call with '...' arguments ... [15:31:47.106] { [15:31:47.106] do.call(function(...) { [15:31:47.106] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:47.106] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:47.106] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:47.106] on.exit(options(oopts), add = TRUE) [15:31:47.106] } [15:31:47.106] { [15:31:47.106] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:47.106] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:47.106] ...future.FUN(...future.X_jj, ...) [15:31:47.106] }) [15:31:47.106] } [15:31:47.106] }, args = future.call.arguments) [15:31:47.106] } [15:31:47.107] Tweak future expression to call with '...' arguments ... DONE [15:31:47.108] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:47.108] [15:31:47.108] getGlobalsAndPackages() ... DONE [15:31:47.109] run() for 'Future' ... [15:31:47.110] - state: 'created' [15:31:47.110] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:47.111] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:47.112] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:47.112] - Field: 'label' [15:31:47.112] - Field: 'local' [15:31:47.113] - Field: 'owner' [15:31:47.113] - Field: 'envir' [15:31:47.114] - Field: 'packages' [15:31:47.114] - Field: 'gc' [15:31:47.114] - Field: 'conditions' [15:31:47.115] - Field: 'expr' [15:31:47.115] - Field: 'uuid' [15:31:47.116] - Field: 'seed' [15:31:47.116] - Field: 'version' [15:31:47.116] - Field: 'result' [15:31:47.117] - Field: 'asynchronous' [15:31:47.117] - Field: 'calls' [15:31:47.118] - Field: 'globals' [15:31:47.118] - Field: 'stdout' [15:31:47.118] - Field: 'earlySignal' [15:31:47.119] - Field: 'lazy' [15:31:47.119] - Field: 'state' [15:31:47.119] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:47.120] - Launch lazy future ... [15:31:47.120] Packages needed by the future expression (n = 0): [15:31:47.121] Packages needed by future strategies (n = 0): [15:31:47.122] { [15:31:47.122] { [15:31:47.122] { [15:31:47.122] ...future.startTime <- base::Sys.time() [15:31:47.122] { [15:31:47.122] { [15:31:47.122] { [15:31:47.122] base::local({ [15:31:47.122] has_future <- base::requireNamespace("future", [15:31:47.122] quietly = TRUE) [15:31:47.122] if (has_future) { [15:31:47.122] ns <- base::getNamespace("future") [15:31:47.122] version <- ns[[".package"]][["version"]] [15:31:47.122] if (is.null(version)) [15:31:47.122] version <- utils::packageVersion("future") [15:31:47.122] } [15:31:47.122] else { [15:31:47.122] version <- NULL [15:31:47.122] } [15:31:47.122] if (!has_future || version < "1.8.0") { [15:31:47.122] info <- base::c(r_version = base::gsub("R version ", [15:31:47.122] "", base::R.version$version.string), [15:31:47.122] platform = base::sprintf("%s (%s-bit)", [15:31:47.122] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:47.122] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:47.122] "release", "version")], collapse = " "), [15:31:47.122] hostname = base::Sys.info()[["nodename"]]) [15:31:47.122] info <- base::sprintf("%s: %s", base::names(info), [15:31:47.122] info) [15:31:47.122] info <- base::paste(info, collapse = "; ") [15:31:47.122] if (!has_future) { [15:31:47.122] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:47.122] info) [15:31:47.122] } [15:31:47.122] else { [15:31:47.122] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:47.122] info, version) [15:31:47.122] } [15:31:47.122] base::stop(msg) [15:31:47.122] } [15:31:47.122] }) [15:31:47.122] } [15:31:47.122] ...future.strategy.old <- future::plan("list") [15:31:47.122] options(future.plan = NULL) [15:31:47.122] Sys.unsetenv("R_FUTURE_PLAN") [15:31:47.122] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:47.122] } [15:31:47.122] ...future.workdir <- getwd() [15:31:47.122] } [15:31:47.122] ...future.oldOptions <- base::as.list(base::.Options) [15:31:47.122] ...future.oldEnvVars <- base::Sys.getenv() [15:31:47.122] } [15:31:47.122] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:47.122] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:47.122] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:47.122] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:47.122] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:47.122] future.stdout.windows.reencode = NULL, width = 80L) [15:31:47.122] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:47.122] base::names(...future.oldOptions)) [15:31:47.122] } [15:31:47.122] if (FALSE) { [15:31:47.122] } [15:31:47.122] else { [15:31:47.122] if (TRUE) { [15:31:47.122] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:47.122] open = "w") [15:31:47.122] } [15:31:47.122] else { [15:31:47.122] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:47.122] windows = "NUL", "/dev/null"), open = "w") [15:31:47.122] } [15:31:47.122] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:47.122] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:47.122] base::sink(type = "output", split = FALSE) [15:31:47.122] base::close(...future.stdout) [15:31:47.122] }, add = TRUE) [15:31:47.122] } [15:31:47.122] ...future.frame <- base::sys.nframe() [15:31:47.122] ...future.conditions <- base::list() [15:31:47.122] ...future.rng <- base::globalenv()$.Random.seed [15:31:47.122] if (FALSE) { [15:31:47.122] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:47.122] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:47.122] } [15:31:47.122] ...future.result <- base::tryCatch({ [15:31:47.122] base::withCallingHandlers({ [15:31:47.122] ...future.value <- base::withVisible(base::local({ [15:31:47.122] do.call(function(...) { [15:31:47.122] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:47.122] if (!identical(...future.globals.maxSize.org, [15:31:47.122] ...future.globals.maxSize)) { [15:31:47.122] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:47.122] on.exit(options(oopts), add = TRUE) [15:31:47.122] } [15:31:47.122] { [15:31:47.122] lapply(seq_along(...future.elements_ii), [15:31:47.122] FUN = function(jj) { [15:31:47.122] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:47.122] ...future.FUN(...future.X_jj, ...) [15:31:47.122] }) [15:31:47.122] } [15:31:47.122] }, args = future.call.arguments) [15:31:47.122] })) [15:31:47.122] future::FutureResult(value = ...future.value$value, [15:31:47.122] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:47.122] ...future.rng), globalenv = if (FALSE) [15:31:47.122] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:47.122] ...future.globalenv.names)) [15:31:47.122] else NULL, started = ...future.startTime, version = "1.8") [15:31:47.122] }, condition = base::local({ [15:31:47.122] c <- base::c [15:31:47.122] inherits <- base::inherits [15:31:47.122] invokeRestart <- base::invokeRestart [15:31:47.122] length <- base::length [15:31:47.122] list <- base::list [15:31:47.122] seq.int <- base::seq.int [15:31:47.122] signalCondition <- base::signalCondition [15:31:47.122] sys.calls <- base::sys.calls [15:31:47.122] `[[` <- base::`[[` [15:31:47.122] `+` <- base::`+` [15:31:47.122] `<<-` <- base::`<<-` [15:31:47.122] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:47.122] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:47.122] 3L)] [15:31:47.122] } [15:31:47.122] function(cond) { [15:31:47.122] is_error <- inherits(cond, "error") [15:31:47.122] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:47.122] NULL) [15:31:47.122] if (is_error) { [15:31:47.122] sessionInformation <- function() { [15:31:47.122] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:47.122] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:47.122] search = base::search(), system = base::Sys.info()) [15:31:47.122] } [15:31:47.122] ...future.conditions[[length(...future.conditions) + [15:31:47.122] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:47.122] cond$call), session = sessionInformation(), [15:31:47.122] timestamp = base::Sys.time(), signaled = 0L) [15:31:47.122] signalCondition(cond) [15:31:47.122] } [15:31:47.122] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:47.122] "immediateCondition"))) { [15:31:47.122] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:47.122] ...future.conditions[[length(...future.conditions) + [15:31:47.122] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:47.122] if (TRUE && !signal) { [15:31:47.122] muffleCondition <- function (cond, pattern = "^muffle") [15:31:47.122] { [15:31:47.122] inherits <- base::inherits [15:31:47.122] invokeRestart <- base::invokeRestart [15:31:47.122] is.null <- base::is.null [15:31:47.122] muffled <- FALSE [15:31:47.122] if (inherits(cond, "message")) { [15:31:47.122] muffled <- grepl(pattern, "muffleMessage") [15:31:47.122] if (muffled) [15:31:47.122] invokeRestart("muffleMessage") [15:31:47.122] } [15:31:47.122] else if (inherits(cond, "warning")) { [15:31:47.122] muffled <- grepl(pattern, "muffleWarning") [15:31:47.122] if (muffled) [15:31:47.122] invokeRestart("muffleWarning") [15:31:47.122] } [15:31:47.122] else if (inherits(cond, "condition")) { [15:31:47.122] if (!is.null(pattern)) { [15:31:47.122] computeRestarts <- base::computeRestarts [15:31:47.122] grepl <- base::grepl [15:31:47.122] restarts <- computeRestarts(cond) [15:31:47.122] for (restart in restarts) { [15:31:47.122] name <- restart$name [15:31:47.122] if (is.null(name)) [15:31:47.122] next [15:31:47.122] if (!grepl(pattern, name)) [15:31:47.122] next [15:31:47.122] invokeRestart(restart) [15:31:47.122] muffled <- TRUE [15:31:47.122] break [15:31:47.122] } [15:31:47.122] } [15:31:47.122] } [15:31:47.122] invisible(muffled) [15:31:47.122] } [15:31:47.122] muffleCondition(cond, pattern = "^muffle") [15:31:47.122] } [15:31:47.122] } [15:31:47.122] else { [15:31:47.122] if (TRUE) { [15:31:47.122] muffleCondition <- function (cond, pattern = "^muffle") [15:31:47.122] { [15:31:47.122] inherits <- base::inherits [15:31:47.122] invokeRestart <- base::invokeRestart [15:31:47.122] is.null <- base::is.null [15:31:47.122] muffled <- FALSE [15:31:47.122] if (inherits(cond, "message")) { [15:31:47.122] muffled <- grepl(pattern, "muffleMessage") [15:31:47.122] if (muffled) [15:31:47.122] invokeRestart("muffleMessage") [15:31:47.122] } [15:31:47.122] else if (inherits(cond, "warning")) { [15:31:47.122] muffled <- grepl(pattern, "muffleWarning") [15:31:47.122] if (muffled) [15:31:47.122] invokeRestart("muffleWarning") [15:31:47.122] } [15:31:47.122] else if (inherits(cond, "condition")) { [15:31:47.122] if (!is.null(pattern)) { [15:31:47.122] computeRestarts <- base::computeRestarts [15:31:47.122] grepl <- base::grepl [15:31:47.122] restarts <- computeRestarts(cond) [15:31:47.122] for (restart in restarts) { [15:31:47.122] name <- restart$name [15:31:47.122] if (is.null(name)) [15:31:47.122] next [15:31:47.122] if (!grepl(pattern, name)) [15:31:47.122] next [15:31:47.122] invokeRestart(restart) [15:31:47.122] muffled <- TRUE [15:31:47.122] break [15:31:47.122] } [15:31:47.122] } [15:31:47.122] } [15:31:47.122] invisible(muffled) [15:31:47.122] } [15:31:47.122] muffleCondition(cond, pattern = "^muffle") [15:31:47.122] } [15:31:47.122] } [15:31:47.122] } [15:31:47.122] })) [15:31:47.122] }, error = function(ex) { [15:31:47.122] base::structure(base::list(value = NULL, visible = NULL, [15:31:47.122] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:47.122] ...future.rng), started = ...future.startTime, [15:31:47.122] finished = Sys.time(), session_uuid = NA_character_, [15:31:47.122] version = "1.8"), class = "FutureResult") [15:31:47.122] }, finally = { [15:31:47.122] if (!identical(...future.workdir, getwd())) [15:31:47.122] setwd(...future.workdir) [15:31:47.122] { [15:31:47.122] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:47.122] ...future.oldOptions$nwarnings <- NULL [15:31:47.122] } [15:31:47.122] base::options(...future.oldOptions) [15:31:47.122] if (.Platform$OS.type == "windows") { [15:31:47.122] old_names <- names(...future.oldEnvVars) [15:31:47.122] envs <- base::Sys.getenv() [15:31:47.122] names <- names(envs) [15:31:47.122] common <- intersect(names, old_names) [15:31:47.122] added <- setdiff(names, old_names) [15:31:47.122] removed <- setdiff(old_names, names) [15:31:47.122] changed <- common[...future.oldEnvVars[common] != [15:31:47.122] envs[common]] [15:31:47.122] NAMES <- toupper(changed) [15:31:47.122] args <- list() [15:31:47.122] for (kk in seq_along(NAMES)) { [15:31:47.122] name <- changed[[kk]] [15:31:47.122] NAME <- NAMES[[kk]] [15:31:47.122] if (name != NAME && is.element(NAME, old_names)) [15:31:47.122] next [15:31:47.122] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:47.122] } [15:31:47.122] NAMES <- toupper(added) [15:31:47.122] for (kk in seq_along(NAMES)) { [15:31:47.122] name <- added[[kk]] [15:31:47.122] NAME <- NAMES[[kk]] [15:31:47.122] if (name != NAME && is.element(NAME, old_names)) [15:31:47.122] next [15:31:47.122] args[[name]] <- "" [15:31:47.122] } [15:31:47.122] NAMES <- toupper(removed) [15:31:47.122] for (kk in seq_along(NAMES)) { [15:31:47.122] name <- removed[[kk]] [15:31:47.122] NAME <- NAMES[[kk]] [15:31:47.122] if (name != NAME && is.element(NAME, old_names)) [15:31:47.122] next [15:31:47.122] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:47.122] } [15:31:47.122] if (length(args) > 0) [15:31:47.122] base::do.call(base::Sys.setenv, args = args) [15:31:47.122] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:47.122] } [15:31:47.122] else { [15:31:47.122] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:47.122] } [15:31:47.122] { [15:31:47.122] if (base::length(...future.futureOptionsAdded) > [15:31:47.122] 0L) { [15:31:47.122] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:47.122] base::names(opts) <- ...future.futureOptionsAdded [15:31:47.122] base::options(opts) [15:31:47.122] } [15:31:47.122] { [15:31:47.122] { [15:31:47.122] NULL [15:31:47.122] RNGkind("Mersenne-Twister") [15:31:47.122] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:47.122] inherits = FALSE) [15:31:47.122] } [15:31:47.122] options(future.plan = NULL) [15:31:47.122] if (is.na(NA_character_)) [15:31:47.122] Sys.unsetenv("R_FUTURE_PLAN") [15:31:47.122] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:47.122] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:47.122] .init = FALSE) [15:31:47.122] } [15:31:47.122] } [15:31:47.122] } [15:31:47.122] }) [15:31:47.122] if (TRUE) { [15:31:47.122] base::sink(type = "output", split = FALSE) [15:31:47.122] if (TRUE) { [15:31:47.122] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:47.122] } [15:31:47.122] else { [15:31:47.122] ...future.result["stdout"] <- base::list(NULL) [15:31:47.122] } [15:31:47.122] base::close(...future.stdout) [15:31:47.122] ...future.stdout <- NULL [15:31:47.122] } [15:31:47.122] ...future.result$conditions <- ...future.conditions [15:31:47.122] ...future.result$finished <- base::Sys.time() [15:31:47.122] ...future.result [15:31:47.122] } [15:31:47.129] assign_globals() ... [15:31:47.130] List of 5 [15:31:47.130] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:47.130] $ future.call.arguments :List of 1 [15:31:47.130] ..$ length: int 2 [15:31:47.130] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:47.130] $ ...future.elements_ii :List of 4 [15:31:47.130] ..$ c: chr "list" [15:31:47.130] ..$ c: chr "character" [15:31:47.130] ..$ b: chr "numeric" [15:31:47.130] ..$ a: chr "integer" [15:31:47.130] $ ...future.seeds_ii : NULL [15:31:47.130] $ ...future.globals.maxSize: NULL [15:31:47.130] - attr(*, "where")=List of 5 [15:31:47.130] ..$ ...future.FUN : [15:31:47.130] ..$ future.call.arguments : [15:31:47.130] ..$ ...future.elements_ii : [15:31:47.130] ..$ ...future.seeds_ii : [15:31:47.130] ..$ ...future.globals.maxSize: [15:31:47.130] - attr(*, "resolved")= logi FALSE [15:31:47.130] - attr(*, "total_size")= num 2240 [15:31:47.130] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:47.130] - attr(*, "already-done")= logi TRUE [15:31:47.143] - copied '...future.FUN' to environment [15:31:47.143] - copied 'future.call.arguments' to environment [15:31:47.144] - copied '...future.elements_ii' to environment [15:31:47.144] - copied '...future.seeds_ii' to environment [15:31:47.144] - copied '...future.globals.maxSize' to environment [15:31:47.144] assign_globals() ... done [15:31:47.145] plan(): Setting new future strategy stack: [15:31:47.145] List of future strategies: [15:31:47.145] 1. sequential: [15:31:47.145] - args: function (..., envir = parent.frame(), workers = "") [15:31:47.145] - tweaked: FALSE [15:31:47.145] - call: NULL [15:31:47.147] plan(): nbrOfWorkers() = 1 [15:31:47.149] plan(): Setting new future strategy stack: [15:31:47.149] List of future strategies: [15:31:47.149] 1. sequential: [15:31:47.149] - args: function (..., envir = parent.frame(), workers = "") [15:31:47.149] - tweaked: FALSE [15:31:47.149] - call: plan(strategy) [15:31:47.150] plan(): nbrOfWorkers() = 1 [15:31:47.151] SequentialFuture started (and completed) [15:31:47.151] - Launch lazy future ... done [15:31:47.151] run() for 'SequentialFuture' ... done [15:31:47.152] Created future: [15:31:47.152] SequentialFuture: [15:31:47.152] Label: 'future_lapply-1' [15:31:47.152] Expression: [15:31:47.152] { [15:31:47.152] do.call(function(...) { [15:31:47.152] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:47.152] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:47.152] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:47.152] on.exit(options(oopts), add = TRUE) [15:31:47.152] } [15:31:47.152] { [15:31:47.152] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:47.152] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:47.152] ...future.FUN(...future.X_jj, ...) [15:31:47.152] }) [15:31:47.152] } [15:31:47.152] }, args = future.call.arguments) [15:31:47.152] } [15:31:47.152] Lazy evaluation: FALSE [15:31:47.152] Asynchronous evaluation: FALSE [15:31:47.152] Local evaluation: TRUE [15:31:47.152] Environment: R_GlobalEnv [15:31:47.152] Capture standard output: TRUE [15:31:47.152] Capture condition classes: 'condition' (excluding 'nothing') [15:31:47.152] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:47.152] Packages: [15:31:47.152] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:47.152] Resolved: TRUE [15:31:47.152] Value: 240 bytes of class 'list' [15:31:47.152] Early signaling: FALSE [15:31:47.152] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:47.152] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:47.154] Chunk #1 of 1 ... DONE [15:31:47.155] Launching 1 futures (chunks) ... DONE [15:31:47.155] Resolving 1 futures (chunks) ... [15:31:47.155] resolve() on list ... [15:31:47.156] recursive: 0 [15:31:47.156] length: 1 [15:31:47.156] [15:31:47.156] resolved() for 'SequentialFuture' ... [15:31:47.157] - state: 'finished' [15:31:47.157] - run: TRUE [15:31:47.157] - result: 'FutureResult' [15:31:47.157] resolved() for 'SequentialFuture' ... done [15:31:47.161] Future #1 [15:31:47.161] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:47.161] - nx: 1 [15:31:47.161] - relay: TRUE [15:31:47.162] - stdout: TRUE [15:31:47.162] - signal: TRUE [15:31:47.162] - resignal: FALSE [15:31:47.162] - force: TRUE [15:31:47.162] - relayed: [n=1] FALSE [15:31:47.163] - queued futures: [n=1] FALSE [15:31:47.163] - until=1 [15:31:47.163] - relaying element #1 [15:31:47.164] - relayed: [n=1] TRUE [15:31:47.164] - queued futures: [n=1] TRUE [15:31:47.164] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:47.164] length: 0 (resolved future 1) [15:31:47.165] Relaying remaining futures [15:31:47.165] signalConditionsASAP(NULL, pos=0) ... [15:31:47.165] - nx: 1 [15:31:47.165] - relay: TRUE [15:31:47.165] - stdout: TRUE [15:31:47.166] - signal: TRUE [15:31:47.166] - resignal: FALSE [15:31:47.166] - force: TRUE [15:31:47.166] - relayed: [n=1] TRUE [15:31:47.167] - queued futures: [n=1] TRUE - flush all [15:31:47.167] - relayed: [n=1] TRUE [15:31:47.167] - queued futures: [n=1] TRUE [15:31:47.167] signalConditionsASAP(NULL, pos=0) ... done [15:31:47.168] resolve() on list ... DONE [15:31:47.168] - Number of value chunks collected: 1 [15:31:47.168] Resolving 1 futures (chunks) ... DONE [15:31:47.168] Reducing values from 1 chunks ... [15:31:47.169] - Number of values collected after concatenation: 4 [15:31:47.169] - Number of values expected: 4 [15:31:47.169] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [15:31:47.169] Reducing values from 1 chunks ... DONE [15:31:47.170] 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, ...) ... [15:31:47.173] future_lapply() ... [15:31:47.184] Number of chunks: 1 [15:31:47.184] getGlobalsAndPackagesXApply() ... [15:31:47.184] - future.globals: TRUE [15:31:47.184] getGlobalsAndPackages() ... [15:31:47.184] Searching for globals... [15:31:47.201] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [15:31:47.201] Searching for globals ... DONE [15:31:47.201] Resolving globals: FALSE [15:31:47.203] The total size of the 1 globals is 69.62 KiB (71288 bytes) [15:31:47.203] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 69.62 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (69.62 KiB of class 'function') [15:31:47.203] - globals: [1] 'FUN' [15:31:47.204] - packages: [1] 'future' [15:31:47.204] getGlobalsAndPackages() ... DONE [15:31:47.204] - globals found/used: [n=1] 'FUN' [15:31:47.204] - needed namespaces: [n=1] 'future' [15:31:47.204] Finding globals ... DONE [15:31:47.205] - use_args: TRUE [15:31:47.205] - Getting '...' globals ... [15:31:47.205] resolve() on list ... [15:31:47.206] recursive: 0 [15:31:47.206] length: 1 [15:31:47.206] elements: '...' [15:31:47.206] length: 0 (resolved future 1) [15:31:47.206] resolve() on list ... DONE [15:31:47.207] - '...' content: [n=2] 'collapse', 'maxHead' [15:31:47.207] List of 1 [15:31:47.207] $ ...:List of 2 [15:31:47.207] ..$ collapse: chr "; " [15:31:47.207] ..$ maxHead : int 3 [15:31:47.207] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:47.207] - attr(*, "where")=List of 1 [15:31:47.207] ..$ ...: [15:31:47.207] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:47.207] - attr(*, "resolved")= logi TRUE [15:31:47.207] - attr(*, "total_size")= num NA [15:31:47.211] - Getting '...' globals ... DONE [15:31:47.212] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:47.212] List of 2 [15:31:47.212] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:47.212] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:47.212] $ ... :List of 2 [15:31:47.212] ..$ collapse: chr "; " [15:31:47.212] ..$ maxHead : int 3 [15:31:47.212] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:47.212] - attr(*, "where")=List of 2 [15:31:47.212] ..$ ...future.FUN: [15:31:47.212] ..$ ... : [15:31:47.212] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:47.212] - attr(*, "resolved")= logi FALSE [15:31:47.212] - attr(*, "total_size")= num 71456 [15:31:47.220] Packages to be attached in all futures: [n=1] 'future' [15:31:47.220] getGlobalsAndPackagesXApply() ... DONE [15:31:47.221] Number of futures (= number of chunks): 1 [15:31:47.221] Launching 1 futures (chunks) ... [15:31:47.221] Chunk #1 of 1 ... [15:31:47.221] - Finding globals in 'X' for chunk #1 ... [15:31:47.222] getGlobalsAndPackages() ... [15:31:47.222] Searching for globals... [15:31:47.222] [15:31:47.223] Searching for globals ... DONE [15:31:47.223] - globals: [0] [15:31:47.223] getGlobalsAndPackages() ... DONE [15:31:47.223] + additional globals found: [n=0] [15:31:47.224] + additional namespaces needed: [n=0] [15:31:47.224] - Finding globals in 'X' for chunk #1 ... DONE [15:31:47.224] - seeds: [15:31:47.224] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:47.225] getGlobalsAndPackages() ... [15:31:47.225] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:47.225] Resolving globals: FALSE [15:31:47.225] Tweak future expression to call with '...' arguments ... [15:31:47.226] { [15:31:47.226] do.call(function(...) { [15:31:47.226] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:47.226] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:47.226] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:47.226] on.exit(options(oopts), add = TRUE) [15:31:47.226] } [15:31:47.226] { [15:31:47.226] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:47.226] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:47.226] ...future.FUN(...future.X_jj, ...) [15:31:47.226] }) [15:31:47.226] } [15:31:47.226] }, args = future.call.arguments) [15:31:47.226] } [15:31:47.226] Tweak future expression to call with '...' arguments ... DONE [15:31:47.227] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:47.227] - packages: [1] 'future' [15:31:47.228] getGlobalsAndPackages() ... DONE [15:31:47.228] run() for 'Future' ... [15:31:47.228] - state: 'created' [15:31:47.229] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:47.229] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:47.230] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:47.230] - Field: 'label' [15:31:47.230] - Field: 'local' [15:31:47.230] - Field: 'owner' [15:31:47.231] - Field: 'envir' [15:31:47.231] - Field: 'packages' [15:31:47.231] - Field: 'gc' [15:31:47.231] - Field: 'conditions' [15:31:47.231] - Field: 'expr' [15:31:47.232] - Field: 'uuid' [15:31:47.232] - Field: 'seed' [15:31:47.232] - Field: 'version' [15:31:47.232] - Field: 'result' [15:31:47.232] - Field: 'asynchronous' [15:31:47.233] - Field: 'calls' [15:31:47.233] - Field: 'globals' [15:31:47.233] - Field: 'stdout' [15:31:47.233] - Field: 'earlySignal' [15:31:47.233] - Field: 'lazy' [15:31:47.234] - Field: 'state' [15:31:47.234] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:47.234] - Launch lazy future ... [15:31:47.234] Packages needed by the future expression (n = 1): 'future' [15:31:47.235] Packages needed by future strategies (n = 0): [15:31:47.235] { [15:31:47.235] { [15:31:47.235] { [15:31:47.235] ...future.startTime <- base::Sys.time() [15:31:47.235] { [15:31:47.235] { [15:31:47.235] { [15:31:47.235] { [15:31:47.235] base::local({ [15:31:47.235] has_future <- base::requireNamespace("future", [15:31:47.235] quietly = TRUE) [15:31:47.235] if (has_future) { [15:31:47.235] ns <- base::getNamespace("future") [15:31:47.235] version <- ns[[".package"]][["version"]] [15:31:47.235] if (is.null(version)) [15:31:47.235] version <- utils::packageVersion("future") [15:31:47.235] } [15:31:47.235] else { [15:31:47.235] version <- NULL [15:31:47.235] } [15:31:47.235] if (!has_future || version < "1.8.0") { [15:31:47.235] info <- base::c(r_version = base::gsub("R version ", [15:31:47.235] "", base::R.version$version.string), [15:31:47.235] platform = base::sprintf("%s (%s-bit)", [15:31:47.235] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:47.235] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:47.235] "release", "version")], collapse = " "), [15:31:47.235] hostname = base::Sys.info()[["nodename"]]) [15:31:47.235] info <- base::sprintf("%s: %s", base::names(info), [15:31:47.235] info) [15:31:47.235] info <- base::paste(info, collapse = "; ") [15:31:47.235] if (!has_future) { [15:31:47.235] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:47.235] info) [15:31:47.235] } [15:31:47.235] else { [15:31:47.235] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:47.235] info, version) [15:31:47.235] } [15:31:47.235] base::stop(msg) [15:31:47.235] } [15:31:47.235] }) [15:31:47.235] } [15:31:47.235] base::local({ [15:31:47.235] for (pkg in "future") { [15:31:47.235] base::loadNamespace(pkg) [15:31:47.235] base::library(pkg, character.only = TRUE) [15:31:47.235] } [15:31:47.235] }) [15:31:47.235] } [15:31:47.235] ...future.strategy.old <- future::plan("list") [15:31:47.235] options(future.plan = NULL) [15:31:47.235] Sys.unsetenv("R_FUTURE_PLAN") [15:31:47.235] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:47.235] } [15:31:47.235] ...future.workdir <- getwd() [15:31:47.235] } [15:31:47.235] ...future.oldOptions <- base::as.list(base::.Options) [15:31:47.235] ...future.oldEnvVars <- base::Sys.getenv() [15:31:47.235] } [15:31:47.235] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:47.235] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:47.235] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:47.235] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:47.235] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:47.235] future.stdout.windows.reencode = NULL, width = 80L) [15:31:47.235] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:47.235] base::names(...future.oldOptions)) [15:31:47.235] } [15:31:47.235] if (FALSE) { [15:31:47.235] } [15:31:47.235] else { [15:31:47.235] if (TRUE) { [15:31:47.235] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:47.235] open = "w") [15:31:47.235] } [15:31:47.235] else { [15:31:47.235] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:47.235] windows = "NUL", "/dev/null"), open = "w") [15:31:47.235] } [15:31:47.235] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:47.235] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:47.235] base::sink(type = "output", split = FALSE) [15:31:47.235] base::close(...future.stdout) [15:31:47.235] }, add = TRUE) [15:31:47.235] } [15:31:47.235] ...future.frame <- base::sys.nframe() [15:31:47.235] ...future.conditions <- base::list() [15:31:47.235] ...future.rng <- base::globalenv()$.Random.seed [15:31:47.235] if (FALSE) { [15:31:47.235] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:47.235] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:47.235] } [15:31:47.235] ...future.result <- base::tryCatch({ [15:31:47.235] base::withCallingHandlers({ [15:31:47.235] ...future.value <- base::withVisible(base::local({ [15:31:47.235] do.call(function(...) { [15:31:47.235] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:47.235] if (!identical(...future.globals.maxSize.org, [15:31:47.235] ...future.globals.maxSize)) { [15:31:47.235] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:47.235] on.exit(options(oopts), add = TRUE) [15:31:47.235] } [15:31:47.235] { [15:31:47.235] lapply(seq_along(...future.elements_ii), [15:31:47.235] FUN = function(jj) { [15:31:47.235] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:47.235] ...future.FUN(...future.X_jj, ...) [15:31:47.235] }) [15:31:47.235] } [15:31:47.235] }, args = future.call.arguments) [15:31:47.235] })) [15:31:47.235] future::FutureResult(value = ...future.value$value, [15:31:47.235] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:47.235] ...future.rng), globalenv = if (FALSE) [15:31:47.235] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:47.235] ...future.globalenv.names)) [15:31:47.235] else NULL, started = ...future.startTime, version = "1.8") [15:31:47.235] }, condition = base::local({ [15:31:47.235] c <- base::c [15:31:47.235] inherits <- base::inherits [15:31:47.235] invokeRestart <- base::invokeRestart [15:31:47.235] length <- base::length [15:31:47.235] list <- base::list [15:31:47.235] seq.int <- base::seq.int [15:31:47.235] signalCondition <- base::signalCondition [15:31:47.235] sys.calls <- base::sys.calls [15:31:47.235] `[[` <- base::`[[` [15:31:47.235] `+` <- base::`+` [15:31:47.235] `<<-` <- base::`<<-` [15:31:47.235] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:47.235] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:47.235] 3L)] [15:31:47.235] } [15:31:47.235] function(cond) { [15:31:47.235] is_error <- inherits(cond, "error") [15:31:47.235] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:47.235] NULL) [15:31:47.235] if (is_error) { [15:31:47.235] sessionInformation <- function() { [15:31:47.235] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:47.235] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:47.235] search = base::search(), system = base::Sys.info()) [15:31:47.235] } [15:31:47.235] ...future.conditions[[length(...future.conditions) + [15:31:47.235] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:47.235] cond$call), session = sessionInformation(), [15:31:47.235] timestamp = base::Sys.time(), signaled = 0L) [15:31:47.235] signalCondition(cond) [15:31:47.235] } [15:31:47.235] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:47.235] "immediateCondition"))) { [15:31:47.235] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:47.235] ...future.conditions[[length(...future.conditions) + [15:31:47.235] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:47.235] if (TRUE && !signal) { [15:31:47.235] muffleCondition <- function (cond, pattern = "^muffle") [15:31:47.235] { [15:31:47.235] inherits <- base::inherits [15:31:47.235] invokeRestart <- base::invokeRestart [15:31:47.235] is.null <- base::is.null [15:31:47.235] muffled <- FALSE [15:31:47.235] if (inherits(cond, "message")) { [15:31:47.235] muffled <- grepl(pattern, "muffleMessage") [15:31:47.235] if (muffled) [15:31:47.235] invokeRestart("muffleMessage") [15:31:47.235] } [15:31:47.235] else if (inherits(cond, "warning")) { [15:31:47.235] muffled <- grepl(pattern, "muffleWarning") [15:31:47.235] if (muffled) [15:31:47.235] invokeRestart("muffleWarning") [15:31:47.235] } [15:31:47.235] else if (inherits(cond, "condition")) { [15:31:47.235] if (!is.null(pattern)) { [15:31:47.235] computeRestarts <- base::computeRestarts [15:31:47.235] grepl <- base::grepl [15:31:47.235] restarts <- computeRestarts(cond) [15:31:47.235] for (restart in restarts) { [15:31:47.235] name <- restart$name [15:31:47.235] if (is.null(name)) [15:31:47.235] next [15:31:47.235] if (!grepl(pattern, name)) [15:31:47.235] next [15:31:47.235] invokeRestart(restart) [15:31:47.235] muffled <- TRUE [15:31:47.235] break [15:31:47.235] } [15:31:47.235] } [15:31:47.235] } [15:31:47.235] invisible(muffled) [15:31:47.235] } [15:31:47.235] muffleCondition(cond, pattern = "^muffle") [15:31:47.235] } [15:31:47.235] } [15:31:47.235] else { [15:31:47.235] if (TRUE) { [15:31:47.235] muffleCondition <- function (cond, pattern = "^muffle") [15:31:47.235] { [15:31:47.235] inherits <- base::inherits [15:31:47.235] invokeRestart <- base::invokeRestart [15:31:47.235] is.null <- base::is.null [15:31:47.235] muffled <- FALSE [15:31:47.235] if (inherits(cond, "message")) { [15:31:47.235] muffled <- grepl(pattern, "muffleMessage") [15:31:47.235] if (muffled) [15:31:47.235] invokeRestart("muffleMessage") [15:31:47.235] } [15:31:47.235] else if (inherits(cond, "warning")) { [15:31:47.235] muffled <- grepl(pattern, "muffleWarning") [15:31:47.235] if (muffled) [15:31:47.235] invokeRestart("muffleWarning") [15:31:47.235] } [15:31:47.235] else if (inherits(cond, "condition")) { [15:31:47.235] if (!is.null(pattern)) { [15:31:47.235] computeRestarts <- base::computeRestarts [15:31:47.235] grepl <- base::grepl [15:31:47.235] restarts <- computeRestarts(cond) [15:31:47.235] for (restart in restarts) { [15:31:47.235] name <- restart$name [15:31:47.235] if (is.null(name)) [15:31:47.235] next [15:31:47.235] if (!grepl(pattern, name)) [15:31:47.235] next [15:31:47.235] invokeRestart(restart) [15:31:47.235] muffled <- TRUE [15:31:47.235] break [15:31:47.235] } [15:31:47.235] } [15:31:47.235] } [15:31:47.235] invisible(muffled) [15:31:47.235] } [15:31:47.235] muffleCondition(cond, pattern = "^muffle") [15:31:47.235] } [15:31:47.235] } [15:31:47.235] } [15:31:47.235] })) [15:31:47.235] }, error = function(ex) { [15:31:47.235] base::structure(base::list(value = NULL, visible = NULL, [15:31:47.235] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:47.235] ...future.rng), started = ...future.startTime, [15:31:47.235] finished = Sys.time(), session_uuid = NA_character_, [15:31:47.235] version = "1.8"), class = "FutureResult") [15:31:47.235] }, finally = { [15:31:47.235] if (!identical(...future.workdir, getwd())) [15:31:47.235] setwd(...future.workdir) [15:31:47.235] { [15:31:47.235] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:47.235] ...future.oldOptions$nwarnings <- NULL [15:31:47.235] } [15:31:47.235] base::options(...future.oldOptions) [15:31:47.235] if (.Platform$OS.type == "windows") { [15:31:47.235] old_names <- names(...future.oldEnvVars) [15:31:47.235] envs <- base::Sys.getenv() [15:31:47.235] names <- names(envs) [15:31:47.235] common <- intersect(names, old_names) [15:31:47.235] added <- setdiff(names, old_names) [15:31:47.235] removed <- setdiff(old_names, names) [15:31:47.235] changed <- common[...future.oldEnvVars[common] != [15:31:47.235] envs[common]] [15:31:47.235] NAMES <- toupper(changed) [15:31:47.235] args <- list() [15:31:47.235] for (kk in seq_along(NAMES)) { [15:31:47.235] name <- changed[[kk]] [15:31:47.235] NAME <- NAMES[[kk]] [15:31:47.235] if (name != NAME && is.element(NAME, old_names)) [15:31:47.235] next [15:31:47.235] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:47.235] } [15:31:47.235] NAMES <- toupper(added) [15:31:47.235] for (kk in seq_along(NAMES)) { [15:31:47.235] name <- added[[kk]] [15:31:47.235] NAME <- NAMES[[kk]] [15:31:47.235] if (name != NAME && is.element(NAME, old_names)) [15:31:47.235] next [15:31:47.235] args[[name]] <- "" [15:31:47.235] } [15:31:47.235] NAMES <- toupper(removed) [15:31:47.235] for (kk in seq_along(NAMES)) { [15:31:47.235] name <- removed[[kk]] [15:31:47.235] NAME <- NAMES[[kk]] [15:31:47.235] if (name != NAME && is.element(NAME, old_names)) [15:31:47.235] next [15:31:47.235] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:47.235] } [15:31:47.235] if (length(args) > 0) [15:31:47.235] base::do.call(base::Sys.setenv, args = args) [15:31:47.235] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:47.235] } [15:31:47.235] else { [15:31:47.235] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:47.235] } [15:31:47.235] { [15:31:47.235] if (base::length(...future.futureOptionsAdded) > [15:31:47.235] 0L) { [15:31:47.235] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:47.235] base::names(opts) <- ...future.futureOptionsAdded [15:31:47.235] base::options(opts) [15:31:47.235] } [15:31:47.235] { [15:31:47.235] { [15:31:47.235] NULL [15:31:47.235] RNGkind("Mersenne-Twister") [15:31:47.235] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:47.235] inherits = FALSE) [15:31:47.235] } [15:31:47.235] options(future.plan = NULL) [15:31:47.235] if (is.na(NA_character_)) [15:31:47.235] Sys.unsetenv("R_FUTURE_PLAN") [15:31:47.235] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:47.235] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:47.235] .init = FALSE) [15:31:47.235] } [15:31:47.235] } [15:31:47.235] } [15:31:47.235] }) [15:31:47.235] if (TRUE) { [15:31:47.235] base::sink(type = "output", split = FALSE) [15:31:47.235] if (TRUE) { [15:31:47.235] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:47.235] } [15:31:47.235] else { [15:31:47.235] ...future.result["stdout"] <- base::list(NULL) [15:31:47.235] } [15:31:47.235] base::close(...future.stdout) [15:31:47.235] ...future.stdout <- NULL [15:31:47.235] } [15:31:47.235] ...future.result$conditions <- ...future.conditions [15:31:47.235] ...future.result$finished <- base::Sys.time() [15:31:47.235] ...future.result [15:31:47.235] } [15:31:47.240] assign_globals() ... [15:31:47.240] List of 5 [15:31:47.240] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:47.240] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:47.240] $ future.call.arguments :List of 2 [15:31:47.240] ..$ collapse: chr "; " [15:31:47.240] ..$ maxHead : int 3 [15:31:47.240] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:47.240] $ ...future.elements_ii :List of 1 [15:31:47.240] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [15:31:47.240] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [15:31:47.240] $ ...future.seeds_ii : NULL [15:31:47.240] $ ...future.globals.maxSize: NULL [15:31:47.240] - attr(*, "where")=List of 5 [15:31:47.240] ..$ ...future.FUN : [15:31:47.240] ..$ future.call.arguments : [15:31:47.240] ..$ ...future.elements_ii : [15:31:47.240] ..$ ...future.seeds_ii : [15:31:47.240] ..$ ...future.globals.maxSize: [15:31:47.240] - attr(*, "resolved")= logi FALSE [15:31:47.240] - attr(*, "total_size")= num 71456 [15:31:47.240] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:47.240] - attr(*, "already-done")= logi TRUE [15:31:47.249] - copied '...future.FUN' to environment [15:31:47.250] - copied 'future.call.arguments' to environment [15:31:47.250] - copied '...future.elements_ii' to environment [15:31:47.250] - copied '...future.seeds_ii' to environment [15:31:47.251] - copied '...future.globals.maxSize' to environment [15:31:47.251] assign_globals() ... done [15:31:47.252] plan(): Setting new future strategy stack: [15:31:47.253] List of future strategies: [15:31:47.253] 1. sequential: [15:31:47.253] - args: function (..., envir = parent.frame(), workers = "") [15:31:47.253] - tweaked: FALSE [15:31:47.253] - call: NULL [15:31:47.254] plan(): nbrOfWorkers() = 1 [15:31:47.256] plan(): Setting new future strategy stack: [15:31:47.257] List of future strategies: [15:31:47.257] 1. sequential: [15:31:47.257] - args: function (..., envir = parent.frame(), workers = "") [15:31:47.257] - tweaked: FALSE [15:31:47.257] - call: plan(strategy) [15:31:47.258] plan(): nbrOfWorkers() = 1 [15:31:47.258] SequentialFuture started (and completed) [15:31:47.259] - Launch lazy future ... done [15:31:47.259] run() for 'SequentialFuture' ... done [15:31:47.259] Created future: [15:31:47.264] SequentialFuture: [15:31:47.264] Label: 'future_lapply-1' [15:31:47.264] Expression: [15:31:47.264] { [15:31:47.264] do.call(function(...) { [15:31:47.264] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:47.264] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:47.264] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:47.264] on.exit(options(oopts), add = TRUE) [15:31:47.264] } [15:31:47.264] { [15:31:47.264] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:47.264] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:47.264] ...future.FUN(...future.X_jj, ...) [15:31:47.264] }) [15:31:47.264] } [15:31:47.264] }, args = future.call.arguments) [15:31:47.264] } [15:31:47.264] Lazy evaluation: FALSE [15:31:47.264] Asynchronous evaluation: FALSE [15:31:47.264] Local evaluation: TRUE [15:31:47.264] Environment: R_GlobalEnv [15:31:47.264] Capture standard output: TRUE [15:31:47.264] Capture condition classes: 'condition' (excluding 'nothing') [15:31:47.264] Globals: 5 objects totaling 82.61 KiB (function '...future.FUN' of 69.62 KiB, DotDotDotList 'future.call.arguments' of 168 bytes, list '...future.elements_ii' of 12.83 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:47.264] Packages: 1 packages ('future') [15:31:47.264] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:47.264] Resolved: TRUE [15:31:47.264] Value: 136 bytes of class 'list' [15:31:47.264] Early signaling: FALSE [15:31:47.264] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:47.264] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:47.267] Chunk #1 of 1 ... DONE [15:31:47.268] Launching 1 futures (chunks) ... DONE [15:31:47.268] Resolving 1 futures (chunks) ... [15:31:47.268] resolve() on list ... [15:31:47.269] recursive: 0 [15:31:47.269] length: 1 [15:31:47.269] [15:31:47.270] resolved() for 'SequentialFuture' ... [15:31:47.270] - state: 'finished' [15:31:47.271] - run: TRUE [15:31:47.271] - result: 'FutureResult' [15:31:47.271] resolved() for 'SequentialFuture' ... done [15:31:47.272] Future #1 [15:31:47.272] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:47.273] - nx: 1 [15:31:47.273] - relay: TRUE [15:31:47.273] - stdout: TRUE [15:31:47.274] - signal: TRUE [15:31:47.274] - resignal: FALSE [15:31:47.274] - force: TRUE [15:31:47.275] - relayed: [n=1] FALSE [15:31:47.275] - queued futures: [n=1] FALSE [15:31:47.275] - until=1 [15:31:47.276] - relaying element #1 [15:31:47.276] - relayed: [n=1] TRUE [15:31:47.277] - queued futures: [n=1] TRUE [15:31:47.277] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:47.278] length: 0 (resolved future 1) [15:31:47.278] Relaying remaining futures [15:31:47.278] signalConditionsASAP(NULL, pos=0) ... [15:31:47.279] - nx: 1 [15:31:47.279] - relay: TRUE [15:31:47.279] - stdout: TRUE [15:31:47.280] - signal: TRUE [15:31:47.280] - resignal: FALSE [15:31:47.280] - force: TRUE [15:31:47.281] - relayed: [n=1] TRUE [15:31:47.281] - queued futures: [n=1] TRUE - flush all [15:31:47.281] - relayed: [n=1] TRUE [15:31:47.282] - queued futures: [n=1] TRUE [15:31:47.282] signalConditionsASAP(NULL, pos=0) ... done [15:31:47.282] resolve() on list ... DONE [15:31:47.283] - Number of value chunks collected: 1 [15:31:47.283] Resolving 1 futures (chunks) ... DONE [15:31:47.283] Reducing values from 1 chunks ... [15:31:47.284] - Number of values collected after concatenation: 1 [15:31:47.284] - Number of values expected: 1 [15:31:47.284] Reducing values from 1 chunks ... DONE [15:31:47.284] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [15:31:47.287] future_lapply() ... [15:31:47.288] Number of chunks: 1 [15:31:47.289] Index remapping (attribute 'ordering'): [n = 2] 2, 1 [15:31:47.289] getGlobalsAndPackagesXApply() ... [15:31:47.289] - future.globals: TRUE [15:31:47.290] getGlobalsAndPackages() ... [15:31:47.290] Searching for globals... [15:31:47.293] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [15:31:47.293] Searching for globals ... DONE [15:31:47.294] Resolving globals: FALSE [15:31:47.294] The total size of the 1 globals is 4.85 KiB (4968 bytes) [15:31:47.295] The total size of the 1 globals exported for future expression ('FUN()') is 4.85 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (4.85 KiB of class 'function') [15:31:47.296] - globals: [1] 'FUN' [15:31:47.296] - packages: [1] 'listenv' [15:31:47.296] getGlobalsAndPackages() ... DONE [15:31:47.297] - globals found/used: [n=1] 'FUN' [15:31:47.297] - needed namespaces: [n=1] 'listenv' [15:31:47.297] Finding globals ... DONE [15:31:47.297] - use_args: TRUE [15:31:47.298] - Getting '...' globals ... [15:31:47.298] resolve() on list ... [15:31:47.299] recursive: 0 [15:31:47.299] length: 1 [15:31:47.299] elements: '...' [15:31:47.299] length: 0 (resolved future 1) [15:31:47.300] resolve() on list ... DONE [15:31:47.300] - '...' content: [n=0] [15:31:47.300] List of 1 [15:31:47.300] $ ...: list() [15:31:47.300] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:47.300] - attr(*, "where")=List of 1 [15:31:47.300] ..$ ...: [15:31:47.300] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:47.300] - attr(*, "resolved")= logi TRUE [15:31:47.300] - attr(*, "total_size")= num NA [15:31:47.305] - Getting '...' globals ... DONE [15:31:47.306] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:47.306] List of 2 [15:31:47.306] $ ...future.FUN:function (x, ...) [15:31:47.306] $ ... : list() [15:31:47.306] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:47.306] - attr(*, "where")=List of 2 [15:31:47.306] ..$ ...future.FUN: [15:31:47.306] ..$ ... : [15:31:47.306] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:47.306] - attr(*, "resolved")= logi FALSE [15:31:47.306] - attr(*, "total_size")= num 4968 [15:31:47.315] Packages to be attached in all futures: [n=1] 'listenv' [15:31:47.316] getGlobalsAndPackagesXApply() ... DONE [15:31:47.316] Number of futures (= number of chunks): 1 [15:31:47.316] Launching 1 futures (chunks) ... [15:31:47.317] Chunk #1 of 1 ... [15:31:47.317] - Finding globals in 'X' for chunk #1 ... [15:31:47.317] getGlobalsAndPackages() ... [15:31:47.318] Searching for globals... [15:31:47.319] [15:31:47.319] Searching for globals ... DONE [15:31:47.320] - globals: [0] [15:31:47.320] getGlobalsAndPackages() ... DONE [15:31:47.320] + additional globals found: [n=0] [15:31:47.321] + additional namespaces needed: [n=0] [15:31:47.321] - Finding globals in 'X' for chunk #1 ... DONE [15:31:47.321] - seeds: [15:31:47.322] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:47.322] getGlobalsAndPackages() ... [15:31:47.322] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:47.322] Resolving globals: FALSE [15:31:47.323] Tweak future expression to call with '...' arguments ... [15:31:47.323] { [15:31:47.323] do.call(function(...) { [15:31:47.323] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:47.323] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:47.323] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:47.323] on.exit(options(oopts), add = TRUE) [15:31:47.323] } [15:31:47.323] { [15:31:47.323] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:47.323] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:47.323] ...future.FUN(...future.X_jj, ...) [15:31:47.323] }) [15:31:47.323] } [15:31:47.323] }, args = future.call.arguments) [15:31:47.323] } [15:31:47.324] Tweak future expression to call with '...' arguments ... DONE [15:31:47.325] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:47.325] - packages: [1] 'listenv' [15:31:47.325] getGlobalsAndPackages() ... DONE [15:31:47.326] run() for 'Future' ... [15:31:47.326] - state: 'created' [15:31:47.327] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:47.327] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:47.327] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:47.328] - Field: 'label' [15:31:47.328] - Field: 'local' [15:31:47.328] - Field: 'owner' [15:31:47.329] - Field: 'envir' [15:31:47.329] - Field: 'packages' [15:31:47.329] - Field: 'gc' [15:31:47.329] - Field: 'conditions' [15:31:47.330] - Field: 'expr' [15:31:47.330] - Field: 'uuid' [15:31:47.330] - Field: 'seed' [15:31:47.331] - Field: 'version' [15:31:47.331] - Field: 'result' [15:31:47.331] - Field: 'asynchronous' [15:31:47.331] - Field: 'calls' [15:31:47.332] - Field: 'globals' [15:31:47.332] - Field: 'stdout' [15:31:47.332] - Field: 'earlySignal' [15:31:47.332] - Field: 'lazy' [15:31:47.333] - Field: 'state' [15:31:47.333] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:47.333] - Launch lazy future ... [15:31:47.334] Packages needed by the future expression (n = 1): 'listenv' [15:31:47.334] Packages needed by future strategies (n = 0): [15:31:47.335] { [15:31:47.335] { [15:31:47.335] { [15:31:47.335] ...future.startTime <- base::Sys.time() [15:31:47.335] { [15:31:47.335] { [15:31:47.335] { [15:31:47.335] { [15:31:47.335] base::local({ [15:31:47.335] has_future <- base::requireNamespace("future", [15:31:47.335] quietly = TRUE) [15:31:47.335] if (has_future) { [15:31:47.335] ns <- base::getNamespace("future") [15:31:47.335] version <- ns[[".package"]][["version"]] [15:31:47.335] if (is.null(version)) [15:31:47.335] version <- utils::packageVersion("future") [15:31:47.335] } [15:31:47.335] else { [15:31:47.335] version <- NULL [15:31:47.335] } [15:31:47.335] if (!has_future || version < "1.8.0") { [15:31:47.335] info <- base::c(r_version = base::gsub("R version ", [15:31:47.335] "", base::R.version$version.string), [15:31:47.335] platform = base::sprintf("%s (%s-bit)", [15:31:47.335] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:47.335] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:47.335] "release", "version")], collapse = " "), [15:31:47.335] hostname = base::Sys.info()[["nodename"]]) [15:31:47.335] info <- base::sprintf("%s: %s", base::names(info), [15:31:47.335] info) [15:31:47.335] info <- base::paste(info, collapse = "; ") [15:31:47.335] if (!has_future) { [15:31:47.335] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:47.335] info) [15:31:47.335] } [15:31:47.335] else { [15:31:47.335] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:47.335] info, version) [15:31:47.335] } [15:31:47.335] base::stop(msg) [15:31:47.335] } [15:31:47.335] }) [15:31:47.335] } [15:31:47.335] base::local({ [15:31:47.335] for (pkg in "listenv") { [15:31:47.335] base::loadNamespace(pkg) [15:31:47.335] base::library(pkg, character.only = TRUE) [15:31:47.335] } [15:31:47.335] }) [15:31:47.335] } [15:31:47.335] ...future.strategy.old <- future::plan("list") [15:31:47.335] options(future.plan = NULL) [15:31:47.335] Sys.unsetenv("R_FUTURE_PLAN") [15:31:47.335] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:47.335] } [15:31:47.335] ...future.workdir <- getwd() [15:31:47.335] } [15:31:47.335] ...future.oldOptions <- base::as.list(base::.Options) [15:31:47.335] ...future.oldEnvVars <- base::Sys.getenv() [15:31:47.335] } [15:31:47.335] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:47.335] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:47.335] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:47.335] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:47.335] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:47.335] future.stdout.windows.reencode = NULL, width = 80L) [15:31:47.335] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:47.335] base::names(...future.oldOptions)) [15:31:47.335] } [15:31:47.335] if (FALSE) { [15:31:47.335] } [15:31:47.335] else { [15:31:47.335] if (TRUE) { [15:31:47.335] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:47.335] open = "w") [15:31:47.335] } [15:31:47.335] else { [15:31:47.335] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:47.335] windows = "NUL", "/dev/null"), open = "w") [15:31:47.335] } [15:31:47.335] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:47.335] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:47.335] base::sink(type = "output", split = FALSE) [15:31:47.335] base::close(...future.stdout) [15:31:47.335] }, add = TRUE) [15:31:47.335] } [15:31:47.335] ...future.frame <- base::sys.nframe() [15:31:47.335] ...future.conditions <- base::list() [15:31:47.335] ...future.rng <- base::globalenv()$.Random.seed [15:31:47.335] if (FALSE) { [15:31:47.335] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:47.335] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:47.335] } [15:31:47.335] ...future.result <- base::tryCatch({ [15:31:47.335] base::withCallingHandlers({ [15:31:47.335] ...future.value <- base::withVisible(base::local({ [15:31:47.335] do.call(function(...) { [15:31:47.335] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:47.335] if (!identical(...future.globals.maxSize.org, [15:31:47.335] ...future.globals.maxSize)) { [15:31:47.335] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:47.335] on.exit(options(oopts), add = TRUE) [15:31:47.335] } [15:31:47.335] { [15:31:47.335] lapply(seq_along(...future.elements_ii), [15:31:47.335] FUN = function(jj) { [15:31:47.335] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:47.335] ...future.FUN(...future.X_jj, ...) [15:31:47.335] }) [15:31:47.335] } [15:31:47.335] }, args = future.call.arguments) [15:31:47.335] })) [15:31:47.335] future::FutureResult(value = ...future.value$value, [15:31:47.335] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:47.335] ...future.rng), globalenv = if (FALSE) [15:31:47.335] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:47.335] ...future.globalenv.names)) [15:31:47.335] else NULL, started = ...future.startTime, version = "1.8") [15:31:47.335] }, condition = base::local({ [15:31:47.335] c <- base::c [15:31:47.335] inherits <- base::inherits [15:31:47.335] invokeRestart <- base::invokeRestart [15:31:47.335] length <- base::length [15:31:47.335] list <- base::list [15:31:47.335] seq.int <- base::seq.int [15:31:47.335] signalCondition <- base::signalCondition [15:31:47.335] sys.calls <- base::sys.calls [15:31:47.335] `[[` <- base::`[[` [15:31:47.335] `+` <- base::`+` [15:31:47.335] `<<-` <- base::`<<-` [15:31:47.335] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:47.335] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:47.335] 3L)] [15:31:47.335] } [15:31:47.335] function(cond) { [15:31:47.335] is_error <- inherits(cond, "error") [15:31:47.335] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:47.335] NULL) [15:31:47.335] if (is_error) { [15:31:47.335] sessionInformation <- function() { [15:31:47.335] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:47.335] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:47.335] search = base::search(), system = base::Sys.info()) [15:31:47.335] } [15:31:47.335] ...future.conditions[[length(...future.conditions) + [15:31:47.335] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:47.335] cond$call), session = sessionInformation(), [15:31:47.335] timestamp = base::Sys.time(), signaled = 0L) [15:31:47.335] signalCondition(cond) [15:31:47.335] } [15:31:47.335] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:47.335] "immediateCondition"))) { [15:31:47.335] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:47.335] ...future.conditions[[length(...future.conditions) + [15:31:47.335] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:47.335] if (TRUE && !signal) { [15:31:47.335] muffleCondition <- function (cond, pattern = "^muffle") [15:31:47.335] { [15:31:47.335] inherits <- base::inherits [15:31:47.335] invokeRestart <- base::invokeRestart [15:31:47.335] is.null <- base::is.null [15:31:47.335] muffled <- FALSE [15:31:47.335] if (inherits(cond, "message")) { [15:31:47.335] muffled <- grepl(pattern, "muffleMessage") [15:31:47.335] if (muffled) [15:31:47.335] invokeRestart("muffleMessage") [15:31:47.335] } [15:31:47.335] else if (inherits(cond, "warning")) { [15:31:47.335] muffled <- grepl(pattern, "muffleWarning") [15:31:47.335] if (muffled) [15:31:47.335] invokeRestart("muffleWarning") [15:31:47.335] } [15:31:47.335] else if (inherits(cond, "condition")) { [15:31:47.335] if (!is.null(pattern)) { [15:31:47.335] computeRestarts <- base::computeRestarts [15:31:47.335] grepl <- base::grepl [15:31:47.335] restarts <- computeRestarts(cond) [15:31:47.335] for (restart in restarts) { [15:31:47.335] name <- restart$name [15:31:47.335] if (is.null(name)) [15:31:47.335] next [15:31:47.335] if (!grepl(pattern, name)) [15:31:47.335] next [15:31:47.335] invokeRestart(restart) [15:31:47.335] muffled <- TRUE [15:31:47.335] break [15:31:47.335] } [15:31:47.335] } [15:31:47.335] } [15:31:47.335] invisible(muffled) [15:31:47.335] } [15:31:47.335] muffleCondition(cond, pattern = "^muffle") [15:31:47.335] } [15:31:47.335] } [15:31:47.335] else { [15:31:47.335] if (TRUE) { [15:31:47.335] muffleCondition <- function (cond, pattern = "^muffle") [15:31:47.335] { [15:31:47.335] inherits <- base::inherits [15:31:47.335] invokeRestart <- base::invokeRestart [15:31:47.335] is.null <- base::is.null [15:31:47.335] muffled <- FALSE [15:31:47.335] if (inherits(cond, "message")) { [15:31:47.335] muffled <- grepl(pattern, "muffleMessage") [15:31:47.335] if (muffled) [15:31:47.335] invokeRestart("muffleMessage") [15:31:47.335] } [15:31:47.335] else if (inherits(cond, "warning")) { [15:31:47.335] muffled <- grepl(pattern, "muffleWarning") [15:31:47.335] if (muffled) [15:31:47.335] invokeRestart("muffleWarning") [15:31:47.335] } [15:31:47.335] else if (inherits(cond, "condition")) { [15:31:47.335] if (!is.null(pattern)) { [15:31:47.335] computeRestarts <- base::computeRestarts [15:31:47.335] grepl <- base::grepl [15:31:47.335] restarts <- computeRestarts(cond) [15:31:47.335] for (restart in restarts) { [15:31:47.335] name <- restart$name [15:31:47.335] if (is.null(name)) [15:31:47.335] next [15:31:47.335] if (!grepl(pattern, name)) [15:31:47.335] next [15:31:47.335] invokeRestart(restart) [15:31:47.335] muffled <- TRUE [15:31:47.335] break [15:31:47.335] } [15:31:47.335] } [15:31:47.335] } [15:31:47.335] invisible(muffled) [15:31:47.335] } [15:31:47.335] muffleCondition(cond, pattern = "^muffle") [15:31:47.335] } [15:31:47.335] } [15:31:47.335] } [15:31:47.335] })) [15:31:47.335] }, error = function(ex) { [15:31:47.335] base::structure(base::list(value = NULL, visible = NULL, [15:31:47.335] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:47.335] ...future.rng), started = ...future.startTime, [15:31:47.335] finished = Sys.time(), session_uuid = NA_character_, [15:31:47.335] version = "1.8"), class = "FutureResult") [15:31:47.335] }, finally = { [15:31:47.335] if (!identical(...future.workdir, getwd())) [15:31:47.335] setwd(...future.workdir) [15:31:47.335] { [15:31:47.335] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:47.335] ...future.oldOptions$nwarnings <- NULL [15:31:47.335] } [15:31:47.335] base::options(...future.oldOptions) [15:31:47.335] if (.Platform$OS.type == "windows") { [15:31:47.335] old_names <- names(...future.oldEnvVars) [15:31:47.335] envs <- base::Sys.getenv() [15:31:47.335] names <- names(envs) [15:31:47.335] common <- intersect(names, old_names) [15:31:47.335] added <- setdiff(names, old_names) [15:31:47.335] removed <- setdiff(old_names, names) [15:31:47.335] changed <- common[...future.oldEnvVars[common] != [15:31:47.335] envs[common]] [15:31:47.335] NAMES <- toupper(changed) [15:31:47.335] args <- list() [15:31:47.335] for (kk in seq_along(NAMES)) { [15:31:47.335] name <- changed[[kk]] [15:31:47.335] NAME <- NAMES[[kk]] [15:31:47.335] if (name != NAME && is.element(NAME, old_names)) [15:31:47.335] next [15:31:47.335] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:47.335] } [15:31:47.335] NAMES <- toupper(added) [15:31:47.335] for (kk in seq_along(NAMES)) { [15:31:47.335] name <- added[[kk]] [15:31:47.335] NAME <- NAMES[[kk]] [15:31:47.335] if (name != NAME && is.element(NAME, old_names)) [15:31:47.335] next [15:31:47.335] args[[name]] <- "" [15:31:47.335] } [15:31:47.335] NAMES <- toupper(removed) [15:31:47.335] for (kk in seq_along(NAMES)) { [15:31:47.335] name <- removed[[kk]] [15:31:47.335] NAME <- NAMES[[kk]] [15:31:47.335] if (name != NAME && is.element(NAME, old_names)) [15:31:47.335] next [15:31:47.335] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:47.335] } [15:31:47.335] if (length(args) > 0) [15:31:47.335] base::do.call(base::Sys.setenv, args = args) [15:31:47.335] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:47.335] } [15:31:47.335] else { [15:31:47.335] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:47.335] } [15:31:47.335] { [15:31:47.335] if (base::length(...future.futureOptionsAdded) > [15:31:47.335] 0L) { [15:31:47.335] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:47.335] base::names(opts) <- ...future.futureOptionsAdded [15:31:47.335] base::options(opts) [15:31:47.335] } [15:31:47.335] { [15:31:47.335] { [15:31:47.335] NULL [15:31:47.335] RNGkind("Mersenne-Twister") [15:31:47.335] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:47.335] inherits = FALSE) [15:31:47.335] } [15:31:47.335] options(future.plan = NULL) [15:31:47.335] if (is.na(NA_character_)) [15:31:47.335] Sys.unsetenv("R_FUTURE_PLAN") [15:31:47.335] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:47.335] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:47.335] .init = FALSE) [15:31:47.335] } [15:31:47.335] } [15:31:47.335] } [15:31:47.335] }) [15:31:47.335] if (TRUE) { [15:31:47.335] base::sink(type = "output", split = FALSE) [15:31:47.335] if (TRUE) { [15:31:47.335] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:47.335] } [15:31:47.335] else { [15:31:47.335] ...future.result["stdout"] <- base::list(NULL) [15:31:47.335] } [15:31:47.335] base::close(...future.stdout) [15:31:47.335] ...future.stdout <- NULL [15:31:47.335] } [15:31:47.335] ...future.result$conditions <- ...future.conditions [15:31:47.335] ...future.result$finished <- base::Sys.time() [15:31:47.335] ...future.result [15:31:47.335] } [15:31:47.342] assign_globals() ... [15:31:47.342] List of 5 [15:31:47.342] $ ...future.FUN :function (x, ...) [15:31:47.342] $ future.call.arguments : list() [15:31:47.342] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:47.342] $ ...future.elements_ii :List of 2 [15:31:47.342] ..$ b:Classes 'listenv', 'environment' [15:31:47.342] ..$ a:Classes 'listenv', 'environment' [15:31:47.342] $ ...future.seeds_ii : NULL [15:31:47.342] $ ...future.globals.maxSize: NULL [15:31:47.342] - attr(*, "where")=List of 5 [15:31:47.342] ..$ ...future.FUN : [15:31:47.342] ..$ future.call.arguments : [15:31:47.342] ..$ ...future.elements_ii : [15:31:47.342] ..$ ...future.seeds_ii : [15:31:47.342] ..$ ...future.globals.maxSize: [15:31:47.342] - attr(*, "resolved")= logi FALSE [15:31:47.342] - attr(*, "total_size")= num 4968 [15:31:47.342] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:47.342] - attr(*, "already-done")= logi TRUE [15:31:47.353] - copied '...future.FUN' to environment [15:31:47.353] - copied 'future.call.arguments' to environment [15:31:47.353] - copied '...future.elements_ii' to environment [15:31:47.353] - copied '...future.seeds_ii' to environment [15:31:47.354] - copied '...future.globals.maxSize' to environment [15:31:47.354] assign_globals() ... done [15:31:47.355] plan(): Setting new future strategy stack: [15:31:47.355] List of future strategies: [15:31:47.355] 1. sequential: [15:31:47.355] - args: function (..., envir = parent.frame(), workers = "") [15:31:47.355] - tweaked: FALSE [15:31:47.355] - call: NULL [15:31:47.356] plan(): nbrOfWorkers() = 1 [15:31:47.359] plan(): Setting new future strategy stack: [15:31:47.362] List of future strategies: [15:31:47.362] 1. sequential: [15:31:47.362] - args: function (..., envir = parent.frame(), workers = "") [15:31:47.362] - tweaked: FALSE [15:31:47.362] - call: plan(strategy) [15:31:47.363] plan(): nbrOfWorkers() = 1 [15:31:47.364] SequentialFuture started (and completed) [15:31:47.364] - Launch lazy future ... done [15:31:47.364] run() for 'SequentialFuture' ... done [15:31:47.365] Created future: [15:31:47.365] SequentialFuture: [15:31:47.365] Label: 'future_lapply-1' [15:31:47.365] Expression: [15:31:47.365] { [15:31:47.365] do.call(function(...) { [15:31:47.365] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:47.365] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:47.365] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:47.365] on.exit(options(oopts), add = TRUE) [15:31:47.365] } [15:31:47.365] { [15:31:47.365] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:47.365] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:47.365] ...future.FUN(...future.X_jj, ...) [15:31:47.365] }) [15:31:47.365] } [15:31:47.365] }, args = future.call.arguments) [15:31:47.365] } [15:31:47.365] Lazy evaluation: FALSE [15:31:47.365] Asynchronous evaluation: FALSE [15:31:47.365] Local evaluation: TRUE [15:31:47.365] Environment: R_GlobalEnv [15:31:47.365] Capture standard output: TRUE [15:31:47.365] Capture condition classes: 'condition' (excluding 'nothing') [15:31:47.365] Globals: 5 objects totaling 17.90 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 13.05 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:47.365] Packages: 1 packages ('listenv') [15:31:47.365] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:47.365] Resolved: TRUE [15:31:47.365] Value: 800 bytes of class 'list' [15:31:47.365] Early signaling: FALSE [15:31:47.365] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:47.365] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:47.368] Chunk #1 of 1 ... DONE [15:31:47.368] Launching 1 futures (chunks) ... DONE [15:31:47.369] Resolving 1 futures (chunks) ... [15:31:47.369] resolve() on list ... [15:31:47.369] recursive: 0 [15:31:47.369] length: 1 [15:31:47.370] [15:31:47.370] resolved() for 'SequentialFuture' ... [15:31:47.370] - state: 'finished' [15:31:47.371] - run: TRUE [15:31:47.371] - result: 'FutureResult' [15:31:47.371] resolved() for 'SequentialFuture' ... done [15:31:47.372] Future #1 [15:31:47.372] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:47.373] - nx: 1 [15:31:47.373] - relay: TRUE [15:31:47.373] - stdout: TRUE [15:31:47.373] - signal: TRUE [15:31:47.374] - resignal: FALSE [15:31:47.374] - force: TRUE [15:31:47.374] - relayed: [n=1] FALSE [15:31:47.375] - queued futures: [n=1] FALSE [15:31:47.375] - until=1 [15:31:47.375] - relaying element #1 [15:31:47.376] - relayed: [n=1] TRUE [15:31:47.376] - queued futures: [n=1] TRUE [15:31:47.376] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:47.377] length: 0 (resolved future 1) [15:31:47.377] Relaying remaining futures [15:31:47.377] signalConditionsASAP(NULL, pos=0) ... [15:31:47.377] - nx: 1 [15:31:47.378] - relay: TRUE [15:31:47.378] - stdout: TRUE [15:31:47.378] - signal: TRUE [15:31:47.378] - resignal: FALSE [15:31:47.379] - force: TRUE [15:31:47.379] - relayed: [n=1] TRUE [15:31:47.379] - queued futures: [n=1] TRUE - flush all [15:31:47.380] - relayed: [n=1] TRUE [15:31:47.380] - queued futures: [n=1] TRUE [15:31:47.380] signalConditionsASAP(NULL, pos=0) ... done [15:31:47.380] resolve() on list ... DONE [15:31:47.381] - Number of value chunks collected: 1 [15:31:47.381] Resolving 1 futures (chunks) ... DONE [15:31:47.381] Reducing values from 1 chunks ... [15:31:47.382] - Number of values collected after concatenation: 2 [15:31:47.382] - Number of values expected: 2 [15:31:47.382] Reverse index remapping (attribute 'ordering'): [n = 2] 2, 1 [15:31:47.383] Reducing values from 1 chunks ... DONE [15:31:47.383] 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) ... [15:31:47.386] future_lapply() ... [15:31:47.387] Number of chunks: 1 [15:31:47.387] getGlobalsAndPackagesXApply() ... [15:31:47.388] - future.globals: TRUE [15:31:47.388] getGlobalsAndPackages() ... [15:31:47.388] Searching for globals... [15:31:47.390] - globals found: [4] 'FUN', 'sqrt', '+', 'a' [15:31:47.391] Searching for globals ... DONE [15:31:47.391] Resolving globals: FALSE [15:31:47.392] The total size of the 2 globals is 1.93 KiB (1976 bytes) [15:31:47.392] The total size of the 2 globals exported for future expression ('FUN()') is 1.93 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are two globals: 'FUN' (1.88 KiB of class 'function') and 'a' (56 bytes of class 'numeric') [15:31:47.393] - globals: [2] 'FUN', 'a' [15:31:47.393] [15:31:47.393] getGlobalsAndPackages() ... DONE [15:31:47.393] - globals found/used: [n=2] 'FUN', 'a' [15:31:47.394] - needed namespaces: [n=0] [15:31:47.394] Finding globals ... DONE [15:31:47.394] - use_args: TRUE [15:31:47.394] - Getting '...' globals ... [15:31:47.395] resolve() on list ... [15:31:47.395] recursive: 0 [15:31:47.395] length: 1 [15:31:47.396] elements: '...' [15:31:47.396] length: 0 (resolved future 1) [15:31:47.396] resolve() on list ... DONE [15:31:47.396] - '...' content: [n=0] [15:31:47.397] List of 1 [15:31:47.397] $ ...: list() [15:31:47.397] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:47.397] - attr(*, "where")=List of 1 [15:31:47.397] ..$ ...: [15:31:47.397] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:47.397] - attr(*, "resolved")= logi TRUE [15:31:47.397] - attr(*, "total_size")= num NA [15:31:47.404] - Getting '...' globals ... DONE [15:31:47.405] Globals to be used in all futures (chunks): [n=3] '...future.FUN', 'a', '...' [15:31:47.405] List of 3 [15:31:47.405] $ ...future.FUN:function (z) [15:31:47.405] $ a : num 3.14 [15:31:47.405] $ ... : list() [15:31:47.405] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:47.405] - attr(*, "where")=List of 3 [15:31:47.405] ..$ ...future.FUN: [15:31:47.405] ..$ a : [15:31:47.405] ..$ ... : [15:31:47.405] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:47.405] - attr(*, "resolved")= logi FALSE [15:31:47.405] - attr(*, "total_size")= num 1976 [15:31:47.412] Packages to be attached in all futures: [n=0] [15:31:47.412] getGlobalsAndPackagesXApply() ... DONE [15:31:47.412] Number of futures (= number of chunks): 1 [15:31:47.413] Launching 1 futures (chunks) ... [15:31:47.413] Chunk #1 of 1 ... [15:31:47.415] - Finding globals in 'X' for chunk #1 ... [15:31:47.416] getGlobalsAndPackages() ... [15:31:47.416] Searching for globals... [15:31:47.431] [15:31:47.431] Searching for globals ... DONE [15:31:47.431] - globals: [0] [15:31:47.432] getGlobalsAndPackages() ... DONE [15:31:47.432] + additional globals found: [n=0] [15:31:47.432] + additional namespaces needed: [n=0] [15:31:47.432] - Finding globals in 'X' for chunk #1 ... DONE [15:31:47.433] - seeds: [15:31:47.433] - All globals exported: [n=6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:47.433] getGlobalsAndPackages() ... [15:31:47.433] - globals passed as-is: [6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:47.434] Resolving globals: FALSE [15:31:47.434] Tweak future expression to call with '...' arguments ... [15:31:47.434] { [15:31:47.434] do.call(function(...) { [15:31:47.434] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:47.434] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:47.434] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:47.434] on.exit(options(oopts), add = TRUE) [15:31:47.434] } [15:31:47.434] { [15:31:47.434] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:47.434] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:47.434] ...future.FUN(...future.X_jj, ...) [15:31:47.434] }) [15:31:47.434] } [15:31:47.434] }, args = future.call.arguments) [15:31:47.434] } [15:31:47.435] Tweak future expression to call with '...' arguments ... DONE [15:31:47.436] - globals: [6] '...future.FUN', 'a', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:47.436] [15:31:47.436] getGlobalsAndPackages() ... DONE [15:31:47.437] run() for 'Future' ... [15:31:47.437] - state: 'created' [15:31:47.438] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:47.438] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:47.439] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:47.439] - Field: 'label' [15:31:47.439] - Field: 'local' [15:31:47.440] - Field: 'owner' [15:31:47.440] - Field: 'envir' [15:31:47.440] - Field: 'packages' [15:31:47.441] - Field: 'gc' [15:31:47.441] - Field: 'conditions' [15:31:47.441] - Field: 'expr' [15:31:47.441] - Field: 'uuid' [15:31:47.442] - Field: 'seed' [15:31:47.442] - Field: 'version' [15:31:47.442] - Field: 'result' [15:31:47.443] - Field: 'asynchronous' [15:31:47.443] - Field: 'calls' [15:31:47.443] - Field: 'globals' [15:31:47.443] - Field: 'stdout' [15:31:47.444] - Field: 'earlySignal' [15:31:47.444] - Field: 'lazy' [15:31:47.444] - Field: 'state' [15:31:47.445] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:47.445] - Launch lazy future ... [15:31:47.445] Packages needed by the future expression (n = 0): [15:31:47.446] Packages needed by future strategies (n = 0): [15:31:47.447] { [15:31:47.447] { [15:31:47.447] { [15:31:47.447] ...future.startTime <- base::Sys.time() [15:31:47.447] { [15:31:47.447] { [15:31:47.447] { [15:31:47.447] base::local({ [15:31:47.447] has_future <- base::requireNamespace("future", [15:31:47.447] quietly = TRUE) [15:31:47.447] if (has_future) { [15:31:47.447] ns <- base::getNamespace("future") [15:31:47.447] version <- ns[[".package"]][["version"]] [15:31:47.447] if (is.null(version)) [15:31:47.447] version <- utils::packageVersion("future") [15:31:47.447] } [15:31:47.447] else { [15:31:47.447] version <- NULL [15:31:47.447] } [15:31:47.447] if (!has_future || version < "1.8.0") { [15:31:47.447] info <- base::c(r_version = base::gsub("R version ", [15:31:47.447] "", base::R.version$version.string), [15:31:47.447] platform = base::sprintf("%s (%s-bit)", [15:31:47.447] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:47.447] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:47.447] "release", "version")], collapse = " "), [15:31:47.447] hostname = base::Sys.info()[["nodename"]]) [15:31:47.447] info <- base::sprintf("%s: %s", base::names(info), [15:31:47.447] info) [15:31:47.447] info <- base::paste(info, collapse = "; ") [15:31:47.447] if (!has_future) { [15:31:47.447] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:47.447] info) [15:31:47.447] } [15:31:47.447] else { [15:31:47.447] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:47.447] info, version) [15:31:47.447] } [15:31:47.447] base::stop(msg) [15:31:47.447] } [15:31:47.447] }) [15:31:47.447] } [15:31:47.447] ...future.strategy.old <- future::plan("list") [15:31:47.447] options(future.plan = NULL) [15:31:47.447] Sys.unsetenv("R_FUTURE_PLAN") [15:31:47.447] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:47.447] } [15:31:47.447] ...future.workdir <- getwd() [15:31:47.447] } [15:31:47.447] ...future.oldOptions <- base::as.list(base::.Options) [15:31:47.447] ...future.oldEnvVars <- base::Sys.getenv() [15:31:47.447] } [15:31:47.447] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:47.447] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:47.447] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:47.447] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:47.447] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:47.447] future.stdout.windows.reencode = NULL, width = 80L) [15:31:47.447] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:47.447] base::names(...future.oldOptions)) [15:31:47.447] } [15:31:47.447] if (FALSE) { [15:31:47.447] } [15:31:47.447] else { [15:31:47.447] if (TRUE) { [15:31:47.447] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:47.447] open = "w") [15:31:47.447] } [15:31:47.447] else { [15:31:47.447] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:47.447] windows = "NUL", "/dev/null"), open = "w") [15:31:47.447] } [15:31:47.447] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:47.447] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:47.447] base::sink(type = "output", split = FALSE) [15:31:47.447] base::close(...future.stdout) [15:31:47.447] }, add = TRUE) [15:31:47.447] } [15:31:47.447] ...future.frame <- base::sys.nframe() [15:31:47.447] ...future.conditions <- base::list() [15:31:47.447] ...future.rng <- base::globalenv()$.Random.seed [15:31:47.447] if (FALSE) { [15:31:47.447] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:47.447] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:47.447] } [15:31:47.447] ...future.result <- base::tryCatch({ [15:31:47.447] base::withCallingHandlers({ [15:31:47.447] ...future.value <- base::withVisible(base::local({ [15:31:47.447] do.call(function(...) { [15:31:47.447] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:47.447] if (!identical(...future.globals.maxSize.org, [15:31:47.447] ...future.globals.maxSize)) { [15:31:47.447] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:47.447] on.exit(options(oopts), add = TRUE) [15:31:47.447] } [15:31:47.447] { [15:31:47.447] lapply(seq_along(...future.elements_ii), [15:31:47.447] FUN = function(jj) { [15:31:47.447] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:47.447] ...future.FUN(...future.X_jj, ...) [15:31:47.447] }) [15:31:47.447] } [15:31:47.447] }, args = future.call.arguments) [15:31:47.447] })) [15:31:47.447] future::FutureResult(value = ...future.value$value, [15:31:47.447] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:47.447] ...future.rng), globalenv = if (FALSE) [15:31:47.447] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:47.447] ...future.globalenv.names)) [15:31:47.447] else NULL, started = ...future.startTime, version = "1.8") [15:31:47.447] }, condition = base::local({ [15:31:47.447] c <- base::c [15:31:47.447] inherits <- base::inherits [15:31:47.447] invokeRestart <- base::invokeRestart [15:31:47.447] length <- base::length [15:31:47.447] list <- base::list [15:31:47.447] seq.int <- base::seq.int [15:31:47.447] signalCondition <- base::signalCondition [15:31:47.447] sys.calls <- base::sys.calls [15:31:47.447] `[[` <- base::`[[` [15:31:47.447] `+` <- base::`+` [15:31:47.447] `<<-` <- base::`<<-` [15:31:47.447] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:47.447] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:47.447] 3L)] [15:31:47.447] } [15:31:47.447] function(cond) { [15:31:47.447] is_error <- inherits(cond, "error") [15:31:47.447] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:47.447] NULL) [15:31:47.447] if (is_error) { [15:31:47.447] sessionInformation <- function() { [15:31:47.447] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:47.447] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:47.447] search = base::search(), system = base::Sys.info()) [15:31:47.447] } [15:31:47.447] ...future.conditions[[length(...future.conditions) + [15:31:47.447] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:47.447] cond$call), session = sessionInformation(), [15:31:47.447] timestamp = base::Sys.time(), signaled = 0L) [15:31:47.447] signalCondition(cond) [15:31:47.447] } [15:31:47.447] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:47.447] "immediateCondition"))) { [15:31:47.447] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:47.447] ...future.conditions[[length(...future.conditions) + [15:31:47.447] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:47.447] if (TRUE && !signal) { [15:31:47.447] muffleCondition <- function (cond, pattern = "^muffle") [15:31:47.447] { [15:31:47.447] inherits <- base::inherits [15:31:47.447] invokeRestart <- base::invokeRestart [15:31:47.447] is.null <- base::is.null [15:31:47.447] muffled <- FALSE [15:31:47.447] if (inherits(cond, "message")) { [15:31:47.447] muffled <- grepl(pattern, "muffleMessage") [15:31:47.447] if (muffled) [15:31:47.447] invokeRestart("muffleMessage") [15:31:47.447] } [15:31:47.447] else if (inherits(cond, "warning")) { [15:31:47.447] muffled <- grepl(pattern, "muffleWarning") [15:31:47.447] if (muffled) [15:31:47.447] invokeRestart("muffleWarning") [15:31:47.447] } [15:31:47.447] else if (inherits(cond, "condition")) { [15:31:47.447] if (!is.null(pattern)) { [15:31:47.447] computeRestarts <- base::computeRestarts [15:31:47.447] grepl <- base::grepl [15:31:47.447] restarts <- computeRestarts(cond) [15:31:47.447] for (restart in restarts) { [15:31:47.447] name <- restart$name [15:31:47.447] if (is.null(name)) [15:31:47.447] next [15:31:47.447] if (!grepl(pattern, name)) [15:31:47.447] next [15:31:47.447] invokeRestart(restart) [15:31:47.447] muffled <- TRUE [15:31:47.447] break [15:31:47.447] } [15:31:47.447] } [15:31:47.447] } [15:31:47.447] invisible(muffled) [15:31:47.447] } [15:31:47.447] muffleCondition(cond, pattern = "^muffle") [15:31:47.447] } [15:31:47.447] } [15:31:47.447] else { [15:31:47.447] if (TRUE) { [15:31:47.447] muffleCondition <- function (cond, pattern = "^muffle") [15:31:47.447] { [15:31:47.447] inherits <- base::inherits [15:31:47.447] invokeRestart <- base::invokeRestart [15:31:47.447] is.null <- base::is.null [15:31:47.447] muffled <- FALSE [15:31:47.447] if (inherits(cond, "message")) { [15:31:47.447] muffled <- grepl(pattern, "muffleMessage") [15:31:47.447] if (muffled) [15:31:47.447] invokeRestart("muffleMessage") [15:31:47.447] } [15:31:47.447] else if (inherits(cond, "warning")) { [15:31:47.447] muffled <- grepl(pattern, "muffleWarning") [15:31:47.447] if (muffled) [15:31:47.447] invokeRestart("muffleWarning") [15:31:47.447] } [15:31:47.447] else if (inherits(cond, "condition")) { [15:31:47.447] if (!is.null(pattern)) { [15:31:47.447] computeRestarts <- base::computeRestarts [15:31:47.447] grepl <- base::grepl [15:31:47.447] restarts <- computeRestarts(cond) [15:31:47.447] for (restart in restarts) { [15:31:47.447] name <- restart$name [15:31:47.447] if (is.null(name)) [15:31:47.447] next [15:31:47.447] if (!grepl(pattern, name)) [15:31:47.447] next [15:31:47.447] invokeRestart(restart) [15:31:47.447] muffled <- TRUE [15:31:47.447] break [15:31:47.447] } [15:31:47.447] } [15:31:47.447] } [15:31:47.447] invisible(muffled) [15:31:47.447] } [15:31:47.447] muffleCondition(cond, pattern = "^muffle") [15:31:47.447] } [15:31:47.447] } [15:31:47.447] } [15:31:47.447] })) [15:31:47.447] }, error = function(ex) { [15:31:47.447] base::structure(base::list(value = NULL, visible = NULL, [15:31:47.447] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:47.447] ...future.rng), started = ...future.startTime, [15:31:47.447] finished = Sys.time(), session_uuid = NA_character_, [15:31:47.447] version = "1.8"), class = "FutureResult") [15:31:47.447] }, finally = { [15:31:47.447] if (!identical(...future.workdir, getwd())) [15:31:47.447] setwd(...future.workdir) [15:31:47.447] { [15:31:47.447] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:47.447] ...future.oldOptions$nwarnings <- NULL [15:31:47.447] } [15:31:47.447] base::options(...future.oldOptions) [15:31:47.447] if (.Platform$OS.type == "windows") { [15:31:47.447] old_names <- names(...future.oldEnvVars) [15:31:47.447] envs <- base::Sys.getenv() [15:31:47.447] names <- names(envs) [15:31:47.447] common <- intersect(names, old_names) [15:31:47.447] added <- setdiff(names, old_names) [15:31:47.447] removed <- setdiff(old_names, names) [15:31:47.447] changed <- common[...future.oldEnvVars[common] != [15:31:47.447] envs[common]] [15:31:47.447] NAMES <- toupper(changed) [15:31:47.447] args <- list() [15:31:47.447] for (kk in seq_along(NAMES)) { [15:31:47.447] name <- changed[[kk]] [15:31:47.447] NAME <- NAMES[[kk]] [15:31:47.447] if (name != NAME && is.element(NAME, old_names)) [15:31:47.447] next [15:31:47.447] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:47.447] } [15:31:47.447] NAMES <- toupper(added) [15:31:47.447] for (kk in seq_along(NAMES)) { [15:31:47.447] name <- added[[kk]] [15:31:47.447] NAME <- NAMES[[kk]] [15:31:47.447] if (name != NAME && is.element(NAME, old_names)) [15:31:47.447] next [15:31:47.447] args[[name]] <- "" [15:31:47.447] } [15:31:47.447] NAMES <- toupper(removed) [15:31:47.447] for (kk in seq_along(NAMES)) { [15:31:47.447] name <- removed[[kk]] [15:31:47.447] NAME <- NAMES[[kk]] [15:31:47.447] if (name != NAME && is.element(NAME, old_names)) [15:31:47.447] next [15:31:47.447] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:47.447] } [15:31:47.447] if (length(args) > 0) [15:31:47.447] base::do.call(base::Sys.setenv, args = args) [15:31:47.447] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:47.447] } [15:31:47.447] else { [15:31:47.447] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:47.447] } [15:31:47.447] { [15:31:47.447] if (base::length(...future.futureOptionsAdded) > [15:31:47.447] 0L) { [15:31:47.447] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:47.447] base::names(opts) <- ...future.futureOptionsAdded [15:31:47.447] base::options(opts) [15:31:47.447] } [15:31:47.447] { [15:31:47.447] { [15:31:47.447] NULL [15:31:47.447] RNGkind("Mersenne-Twister") [15:31:47.447] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:47.447] inherits = FALSE) [15:31:47.447] } [15:31:47.447] options(future.plan = NULL) [15:31:47.447] if (is.na(NA_character_)) [15:31:47.447] Sys.unsetenv("R_FUTURE_PLAN") [15:31:47.447] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:47.447] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:47.447] .init = FALSE) [15:31:47.447] } [15:31:47.447] } [15:31:47.447] } [15:31:47.447] }) [15:31:47.447] if (TRUE) { [15:31:47.447] base::sink(type = "output", split = FALSE) [15:31:47.447] if (TRUE) { [15:31:47.447] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:47.447] } [15:31:47.447] else { [15:31:47.447] ...future.result["stdout"] <- base::list(NULL) [15:31:47.447] } [15:31:47.447] base::close(...future.stdout) [15:31:47.447] ...future.stdout <- NULL [15:31:47.447] } [15:31:47.447] ...future.result$conditions <- ...future.conditions [15:31:47.447] ...future.result$finished <- base::Sys.time() [15:31:47.447] ...future.result [15:31:47.447] } [15:31:47.453] assign_globals() ... [15:31:47.453] List of 6 [15:31:47.453] $ ...future.FUN :function (z) [15:31:47.453] $ a : num 3.14 [15:31:47.453] $ future.call.arguments : list() [15:31:47.453] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:47.453] $ ...future.elements_ii :List of 10000 [15:31:47.453] ..$ : int 1 [15:31:47.453] ..$ : int 2 [15:31:47.453] ..$ : int 3 [15:31:47.453] ..$ : int 4 [15:31:47.453] ..$ : int 5 [15:31:47.453] ..$ : int 6 [15:31:47.453] ..$ : int 7 [15:31:47.453] ..$ : int 8 [15:31:47.453] ..$ : int 9 [15:31:47.453] ..$ : int 10 [15:31:47.453] ..$ : int 11 [15:31:47.453] ..$ : int 12 [15:31:47.453] ..$ : int 13 [15:31:47.453] ..$ : int 14 [15:31:47.453] ..$ : int 15 [15:31:47.453] ..$ : int 16 [15:31:47.453] ..$ : int 17 [15:31:47.453] ..$ : int 18 [15:31:47.453] ..$ : int 19 [15:31:47.453] ..$ : int 20 [15:31:47.453] ..$ : int 21 [15:31:47.453] ..$ : int 22 [15:31:47.453] ..$ : int 23 [15:31:47.453] ..$ : int 24 [15:31:47.453] ..$ : int 25 [15:31:47.453] ..$ : int 26 [15:31:47.453] ..$ : int 27 [15:31:47.453] ..$ : int 28 [15:31:47.453] ..$ : int 29 [15:31:47.453] ..$ : int 30 [15:31:47.453] ..$ : int 31 [15:31:47.453] ..$ : int 32 [15:31:47.453] ..$ : int 33 [15:31:47.453] ..$ : int 34 [15:31:47.453] ..$ : int 35 [15:31:47.453] ..$ : int 36 [15:31:47.453] ..$ : int 37 [15:31:47.453] ..$ : int 38 [15:31:47.453] ..$ : int 39 [15:31:47.453] ..$ : int 40 [15:31:47.453] ..$ : int 41 [15:31:47.453] ..$ : int 42 [15:31:47.453] ..$ : int 43 [15:31:47.453] ..$ : int 44 [15:31:47.453] ..$ : int 45 [15:31:47.453] ..$ : int 46 [15:31:47.453] ..$ : int 47 [15:31:47.453] ..$ : int 48 [15:31:47.453] ..$ : int 49 [15:31:47.453] ..$ : int 50 [15:31:47.453] ..$ : int 51 [15:31:47.453] ..$ : int 52 [15:31:47.453] ..$ : int 53 [15:31:47.453] ..$ : int 54 [15:31:47.453] ..$ : int 55 [15:31:47.453] ..$ : int 56 [15:31:47.453] ..$ : int 57 [15:31:47.453] ..$ : int 58 [15:31:47.453] ..$ : int 59 [15:31:47.453] ..$ : int 60 [15:31:47.453] ..$ : int 61 [15:31:47.453] ..$ : int 62 [15:31:47.453] ..$ : int 63 [15:31:47.453] ..$ : int 64 [15:31:47.453] ..$ : int 65 [15:31:47.453] ..$ : int 66 [15:31:47.453] ..$ : int 67 [15:31:47.453] ..$ : int 68 [15:31:47.453] ..$ : int 69 [15:31:47.453] ..$ : int 70 [15:31:47.453] ..$ : int 71 [15:31:47.453] ..$ : int 72 [15:31:47.453] ..$ : int 73 [15:31:47.453] ..$ : int 74 [15:31:47.453] ..$ : int 75 [15:31:47.453] ..$ : int 76 [15:31:47.453] ..$ : int 77 [15:31:47.453] ..$ : int 78 [15:31:47.453] ..$ : int 79 [15:31:47.453] ..$ : int 80 [15:31:47.453] ..$ : int 81 [15:31:47.453] ..$ : int 82 [15:31:47.453] ..$ : int 83 [15:31:47.453] ..$ : int 84 [15:31:47.453] ..$ : int 85 [15:31:47.453] ..$ : int 86 [15:31:47.453] ..$ : int 87 [15:31:47.453] ..$ : int 88 [15:31:47.453] ..$ : int 89 [15:31:47.453] ..$ : int 90 [15:31:47.453] ..$ : int 91 [15:31:47.453] ..$ : int 92 [15:31:47.453] ..$ : int 93 [15:31:47.453] ..$ : int 94 [15:31:47.453] ..$ : int 95 [15:31:47.453] ..$ : int 96 [15:31:47.453] ..$ : int 97 [15:31:47.453] ..$ : int 98 [15:31:47.453] ..$ : int 99 [15:31:47.453] .. [list output truncated] [15:31:47.453] $ ...future.seeds_ii : NULL [15:31:47.453] $ ...future.globals.maxSize: NULL [15:31:47.453] - attr(*, "where")=List of 6 [15:31:47.453] ..$ ...future.FUN : [15:31:47.453] ..$ a : [15:31:47.453] ..$ future.call.arguments : [15:31:47.453] ..$ ...future.elements_ii : [15:31:47.453] ..$ ...future.seeds_ii : [15:31:47.453] ..$ ...future.globals.maxSize: [15:31:47.453] - attr(*, "resolved")= logi FALSE [15:31:47.453] - attr(*, "total_size")= num 1976 [15:31:47.453] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:47.453] - attr(*, "already-done")= logi TRUE [15:31:47.577] - reassign environment for '...future.FUN' [15:31:47.577] - copied '...future.FUN' to environment [15:31:47.578] - copied 'a' to environment [15:31:47.578] - copied 'future.call.arguments' to environment [15:31:47.578] - copied '...future.elements_ii' to environment [15:31:47.579] - copied '...future.seeds_ii' to environment [15:31:47.579] - copied '...future.globals.maxSize' to environment [15:31:47.579] assign_globals() ... done [15:31:47.580] plan(): Setting new future strategy stack: [15:31:47.580] List of future strategies: [15:31:47.580] 1. sequential: [15:31:47.580] - args: function (..., envir = parent.frame(), workers = "") [15:31:47.580] - tweaked: FALSE [15:31:47.580] - call: NULL [15:31:47.581] plan(): nbrOfWorkers() = 1 [15:31:47.618] plan(): Setting new future strategy stack: [15:31:47.619] List of future strategies: [15:31:47.619] 1. sequential: [15:31:47.619] - args: function (..., envir = parent.frame(), workers = "") [15:31:47.619] - tweaked: FALSE [15:31:47.619] - call: plan(strategy) [15:31:47.620] plan(): nbrOfWorkers() = 1 [15:31:47.620] SequentialFuture started (and completed) [15:31:47.620] - Launch lazy future ... done [15:31:47.621] run() for 'SequentialFuture' ... done [15:31:47.621] Created future: [15:31:47.621] SequentialFuture: [15:31:47.621] Label: 'future_lapply-1' [15:31:47.621] Expression: [15:31:47.621] { [15:31:47.621] do.call(function(...) { [15:31:47.621] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:47.621] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:47.621] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:47.621] on.exit(options(oopts), add = TRUE) [15:31:47.621] } [15:31:47.621] { [15:31:47.621] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:47.621] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:47.621] ...future.FUN(...future.X_jj, ...) [15:31:47.621] }) [15:31:47.621] } [15:31:47.621] }, args = future.call.arguments) [15:31:47.621] } [15:31:47.621] Lazy evaluation: FALSE [15:31:47.621] Asynchronous evaluation: FALSE [15:31:47.621] Local evaluation: TRUE [15:31:47.621] Environment: R_GlobalEnv [15:31:47.621] Capture standard output: TRUE [15:31:47.621] Capture condition classes: 'condition' (excluding 'nothing') [15:31:47.621] Globals: 6 objects totaling 548.80 KiB (function '...future.FUN' of 1.88 KiB, numeric 'a' of 56 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 546.88 KiB, NULL '...future.seeds_ii' of 0 bytes, ...) [15:31:47.621] Packages: [15:31:47.621] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:47.621] Resolved: TRUE [15:31:47.621] Value: 546.88 KiB of class 'list' [15:31:47.621] Early signaling: FALSE [15:31:47.621] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:47.621] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:47.765] Chunk #1 of 1 ... DONE [15:31:47.765] Launching 1 futures (chunks) ... DONE [15:31:47.766] Resolving 1 futures (chunks) ... [15:31:47.766] resolve() on list ... [15:31:47.766] recursive: 0 [15:31:47.766] length: 1 [15:31:47.767] [15:31:47.767] resolved() for 'SequentialFuture' ... [15:31:47.767] - state: 'finished' [15:31:47.767] - run: TRUE [15:31:47.768] - result: 'FutureResult' [15:31:47.768] resolved() for 'SequentialFuture' ... done [15:31:47.768] Future #1 [15:31:47.768] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:47.769] - nx: 1 [15:31:47.769] - relay: TRUE [15:31:47.769] - stdout: TRUE [15:31:47.769] - signal: TRUE [15:31:47.770] - resignal: FALSE [15:31:47.770] - force: TRUE [15:31:47.770] - relayed: [n=1] FALSE [15:31:47.770] - queued futures: [n=1] FALSE [15:31:47.770] - until=1 [15:31:47.771] - relaying element #1 [15:31:47.771] - relayed: [n=1] TRUE [15:31:47.771] - queued futures: [n=1] TRUE [15:31:47.772] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:47.772] length: 0 (resolved future 1) [15:31:47.772] Relaying remaining futures [15:31:47.772] signalConditionsASAP(NULL, pos=0) ... [15:31:47.773] - nx: 1 [15:31:47.773] - relay: TRUE [15:31:47.773] - stdout: TRUE [15:31:47.773] - signal: TRUE [15:31:47.773] - resignal: FALSE [15:31:47.774] - force: TRUE [15:31:47.774] - relayed: [n=1] TRUE [15:31:47.774] - queued futures: [n=1] TRUE - flush all [15:31:47.774] - relayed: [n=1] TRUE [15:31:47.775] - queued futures: [n=1] TRUE [15:31:47.775] signalConditionsASAP(NULL, pos=0) ... done [15:31:47.775] resolve() on list ... DONE [15:31:47.776] - Number of value chunks collected: 1 [15:31:47.776] Resolving 1 futures (chunks) ... DONE [15:31:47.776] Reducing values from 1 chunks ... [15:31:47.776] - Number of values collected after concatenation: 10000 [15:31:47.777] - Number of values expected: 10000 [15:31:47.777] Reducing values from 1 chunks ... DONE [15:31:47.777] future_lapply() ... DONE - future_lapply(x, FUN = table, ...) ... [15:31:47.780] future_lapply() ... [15:31:47.829] Number of chunks: 1 [15:31:47.829] getGlobalsAndPackagesXApply() ... [15:31:47.829] - future.globals: TRUE [15:31:47.829] getGlobalsAndPackages() ... [15:31:47.829] Searching for globals... [15:31:47.880] - 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<-' [15:31:47.880] Searching for globals ... DONE [15:31:47.881] Resolving globals: FALSE [15:31:47.883] The total size of the 1 globals is 345.92 KiB (354224 bytes) [15:31:47.883] The total size of the 1 globals exported for future expression ('FUN()') is 345.92 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (345.92 KiB of class 'function') [15:31:47.884] - globals: [1] 'FUN' [15:31:47.884] [15:31:47.884] getGlobalsAndPackages() ... DONE [15:31:47.884] - globals found/used: [n=1] 'FUN' [15:31:47.884] - needed namespaces: [n=0] [15:31:47.885] Finding globals ... DONE [15:31:47.885] - use_args: TRUE [15:31:47.885] - Getting '...' globals ... [15:31:47.885] resolve() on list ... [15:31:47.886] recursive: 0 [15:31:47.886] length: 1 [15:31:47.886] elements: '...' [15:31:47.886] length: 0 (resolved future 1) [15:31:47.886] resolve() on list ... DONE [15:31:47.886] - '...' content: [n=0] [15:31:47.887] List of 1 [15:31:47.887] $ ...: list() [15:31:47.887] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:47.887] - attr(*, "where")=List of 1 [15:31:47.887] ..$ ...: [15:31:47.887] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:47.887] - attr(*, "resolved")= logi TRUE [15:31:47.887] - attr(*, "total_size")= num NA [15:31:47.890] - Getting '...' globals ... DONE [15:31:47.891] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:47.891] List of 2 [15:31:47.891] $ ...future.FUN:function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [15:31:47.891] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [15:31:47.891] $ ... : list() [15:31:47.891] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:47.891] - attr(*, "where")=List of 2 [15:31:47.891] ..$ ...future.FUN: [15:31:47.891] ..$ ... : [15:31:47.891] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:47.891] - attr(*, "resolved")= logi FALSE [15:31:47.891] - attr(*, "total_size")= num 354224 [15:31:47.896] Packages to be attached in all futures: [n=0] [15:31:47.896] getGlobalsAndPackagesXApply() ... DONE [15:31:47.897] Number of futures (= number of chunks): 1 [15:31:47.897] Launching 1 futures (chunks) ... [15:31:47.897] Chunk #1 of 1 ... [15:31:47.898] - Finding globals in 'X' for chunk #1 ... [15:31:47.898] getGlobalsAndPackages() ... [15:31:47.898] Searching for globals... [15:31:47.899] [15:31:47.899] Searching for globals ... DONE [15:31:47.899] - globals: [0] [15:31:47.899] getGlobalsAndPackages() ... DONE [15:31:47.900] + additional globals found: [n=0] [15:31:47.900] + additional namespaces needed: [n=0] [15:31:47.900] - Finding globals in 'X' for chunk #1 ... DONE [15:31:47.900] - seeds: [15:31:47.901] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:47.901] getGlobalsAndPackages() ... [15:31:47.901] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:47.902] Resolving globals: FALSE [15:31:47.902] Tweak future expression to call with '...' arguments ... [15:31:47.902] { [15:31:47.902] do.call(function(...) { [15:31:47.902] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:47.902] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:47.902] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:47.902] on.exit(options(oopts), add = TRUE) [15:31:47.902] } [15:31:47.902] { [15:31:47.902] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:47.902] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:47.902] ...future.FUN(...future.X_jj, ...) [15:31:47.902] }) [15:31:47.902] } [15:31:47.902] }, args = future.call.arguments) [15:31:47.902] } [15:31:47.903] Tweak future expression to call with '...' arguments ... DONE [15:31:47.904] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:47.904] [15:31:47.904] getGlobalsAndPackages() ... DONE [15:31:47.905] run() for 'Future' ... [15:31:47.905] - state: 'created' [15:31:47.906] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:47.906] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:47.907] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:47.907] - Field: 'label' [15:31:47.907] - Field: 'local' [15:31:47.908] - Field: 'owner' [15:31:47.908] - Field: 'envir' [15:31:47.908] - Field: 'packages' [15:31:47.908] - Field: 'gc' [15:31:47.909] - Field: 'conditions' [15:31:47.909] - Field: 'expr' [15:31:47.909] - Field: 'uuid' [15:31:47.909] - Field: 'seed' [15:31:47.910] - Field: 'version' [15:31:47.910] - Field: 'result' [15:31:47.910] - Field: 'asynchronous' [15:31:47.910] - Field: 'calls' [15:31:47.911] - Field: 'globals' [15:31:47.911] - Field: 'stdout' [15:31:47.911] - Field: 'earlySignal' [15:31:47.912] - Field: 'lazy' [15:31:47.912] - Field: 'state' [15:31:47.912] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:47.912] - Launch lazy future ... [15:31:47.913] Packages needed by the future expression (n = 0): [15:31:47.913] Packages needed by future strategies (n = 0): [15:31:47.914] { [15:31:47.914] { [15:31:47.914] { [15:31:47.914] ...future.startTime <- base::Sys.time() [15:31:47.914] { [15:31:47.914] { [15:31:47.914] { [15:31:47.914] base::local({ [15:31:47.914] has_future <- base::requireNamespace("future", [15:31:47.914] quietly = TRUE) [15:31:47.914] if (has_future) { [15:31:47.914] ns <- base::getNamespace("future") [15:31:47.914] version <- ns[[".package"]][["version"]] [15:31:47.914] if (is.null(version)) [15:31:47.914] version <- utils::packageVersion("future") [15:31:47.914] } [15:31:47.914] else { [15:31:47.914] version <- NULL [15:31:47.914] } [15:31:47.914] if (!has_future || version < "1.8.0") { [15:31:47.914] info <- base::c(r_version = base::gsub("R version ", [15:31:47.914] "", base::R.version$version.string), [15:31:47.914] platform = base::sprintf("%s (%s-bit)", [15:31:47.914] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:47.914] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:47.914] "release", "version")], collapse = " "), [15:31:47.914] hostname = base::Sys.info()[["nodename"]]) [15:31:47.914] info <- base::sprintf("%s: %s", base::names(info), [15:31:47.914] info) [15:31:47.914] info <- base::paste(info, collapse = "; ") [15:31:47.914] if (!has_future) { [15:31:47.914] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:47.914] info) [15:31:47.914] } [15:31:47.914] else { [15:31:47.914] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:47.914] info, version) [15:31:47.914] } [15:31:47.914] base::stop(msg) [15:31:47.914] } [15:31:47.914] }) [15:31:47.914] } [15:31:47.914] ...future.strategy.old <- future::plan("list") [15:31:47.914] options(future.plan = NULL) [15:31:47.914] Sys.unsetenv("R_FUTURE_PLAN") [15:31:47.914] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:47.914] } [15:31:47.914] ...future.workdir <- getwd() [15:31:47.914] } [15:31:47.914] ...future.oldOptions <- base::as.list(base::.Options) [15:31:47.914] ...future.oldEnvVars <- base::Sys.getenv() [15:31:47.914] } [15:31:47.914] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:47.914] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:47.914] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:47.914] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:47.914] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:47.914] future.stdout.windows.reencode = NULL, width = 80L) [15:31:47.914] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:47.914] base::names(...future.oldOptions)) [15:31:47.914] } [15:31:47.914] if (FALSE) { [15:31:47.914] } [15:31:47.914] else { [15:31:47.914] if (TRUE) { [15:31:47.914] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:47.914] open = "w") [15:31:47.914] } [15:31:47.914] else { [15:31:47.914] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:47.914] windows = "NUL", "/dev/null"), open = "w") [15:31:47.914] } [15:31:47.914] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:47.914] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:47.914] base::sink(type = "output", split = FALSE) [15:31:47.914] base::close(...future.stdout) [15:31:47.914] }, add = TRUE) [15:31:47.914] } [15:31:47.914] ...future.frame <- base::sys.nframe() [15:31:47.914] ...future.conditions <- base::list() [15:31:47.914] ...future.rng <- base::globalenv()$.Random.seed [15:31:47.914] if (FALSE) { [15:31:47.914] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:47.914] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:47.914] } [15:31:47.914] ...future.result <- base::tryCatch({ [15:31:47.914] base::withCallingHandlers({ [15:31:47.914] ...future.value <- base::withVisible(base::local({ [15:31:47.914] do.call(function(...) { [15:31:47.914] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:47.914] if (!identical(...future.globals.maxSize.org, [15:31:47.914] ...future.globals.maxSize)) { [15:31:47.914] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:47.914] on.exit(options(oopts), add = TRUE) [15:31:47.914] } [15:31:47.914] { [15:31:47.914] lapply(seq_along(...future.elements_ii), [15:31:47.914] FUN = function(jj) { [15:31:47.914] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:47.914] ...future.FUN(...future.X_jj, ...) [15:31:47.914] }) [15:31:47.914] } [15:31:47.914] }, args = future.call.arguments) [15:31:47.914] })) [15:31:47.914] future::FutureResult(value = ...future.value$value, [15:31:47.914] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:47.914] ...future.rng), globalenv = if (FALSE) [15:31:47.914] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:47.914] ...future.globalenv.names)) [15:31:47.914] else NULL, started = ...future.startTime, version = "1.8") [15:31:47.914] }, condition = base::local({ [15:31:47.914] c <- base::c [15:31:47.914] inherits <- base::inherits [15:31:47.914] invokeRestart <- base::invokeRestart [15:31:47.914] length <- base::length [15:31:47.914] list <- base::list [15:31:47.914] seq.int <- base::seq.int [15:31:47.914] signalCondition <- base::signalCondition [15:31:47.914] sys.calls <- base::sys.calls [15:31:47.914] `[[` <- base::`[[` [15:31:47.914] `+` <- base::`+` [15:31:47.914] `<<-` <- base::`<<-` [15:31:47.914] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:47.914] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:47.914] 3L)] [15:31:47.914] } [15:31:47.914] function(cond) { [15:31:47.914] is_error <- inherits(cond, "error") [15:31:47.914] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:47.914] NULL) [15:31:47.914] if (is_error) { [15:31:47.914] sessionInformation <- function() { [15:31:47.914] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:47.914] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:47.914] search = base::search(), system = base::Sys.info()) [15:31:47.914] } [15:31:47.914] ...future.conditions[[length(...future.conditions) + [15:31:47.914] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:47.914] cond$call), session = sessionInformation(), [15:31:47.914] timestamp = base::Sys.time(), signaled = 0L) [15:31:47.914] signalCondition(cond) [15:31:47.914] } [15:31:47.914] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:47.914] "immediateCondition"))) { [15:31:47.914] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:47.914] ...future.conditions[[length(...future.conditions) + [15:31:47.914] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:47.914] if (TRUE && !signal) { [15:31:47.914] muffleCondition <- function (cond, pattern = "^muffle") [15:31:47.914] { [15:31:47.914] inherits <- base::inherits [15:31:47.914] invokeRestart <- base::invokeRestart [15:31:47.914] is.null <- base::is.null [15:31:47.914] muffled <- FALSE [15:31:47.914] if (inherits(cond, "message")) { [15:31:47.914] muffled <- grepl(pattern, "muffleMessage") [15:31:47.914] if (muffled) [15:31:47.914] invokeRestart("muffleMessage") [15:31:47.914] } [15:31:47.914] else if (inherits(cond, "warning")) { [15:31:47.914] muffled <- grepl(pattern, "muffleWarning") [15:31:47.914] if (muffled) [15:31:47.914] invokeRestart("muffleWarning") [15:31:47.914] } [15:31:47.914] else if (inherits(cond, "condition")) { [15:31:47.914] if (!is.null(pattern)) { [15:31:47.914] computeRestarts <- base::computeRestarts [15:31:47.914] grepl <- base::grepl [15:31:47.914] restarts <- computeRestarts(cond) [15:31:47.914] for (restart in restarts) { [15:31:47.914] name <- restart$name [15:31:47.914] if (is.null(name)) [15:31:47.914] next [15:31:47.914] if (!grepl(pattern, name)) [15:31:47.914] next [15:31:47.914] invokeRestart(restart) [15:31:47.914] muffled <- TRUE [15:31:47.914] break [15:31:47.914] } [15:31:47.914] } [15:31:47.914] } [15:31:47.914] invisible(muffled) [15:31:47.914] } [15:31:47.914] muffleCondition(cond, pattern = "^muffle") [15:31:47.914] } [15:31:47.914] } [15:31:47.914] else { [15:31:47.914] if (TRUE) { [15:31:47.914] muffleCondition <- function (cond, pattern = "^muffle") [15:31:47.914] { [15:31:47.914] inherits <- base::inherits [15:31:47.914] invokeRestart <- base::invokeRestart [15:31:47.914] is.null <- base::is.null [15:31:47.914] muffled <- FALSE [15:31:47.914] if (inherits(cond, "message")) { [15:31:47.914] muffled <- grepl(pattern, "muffleMessage") [15:31:47.914] if (muffled) [15:31:47.914] invokeRestart("muffleMessage") [15:31:47.914] } [15:31:47.914] else if (inherits(cond, "warning")) { [15:31:47.914] muffled <- grepl(pattern, "muffleWarning") [15:31:47.914] if (muffled) [15:31:47.914] invokeRestart("muffleWarning") [15:31:47.914] } [15:31:47.914] else if (inherits(cond, "condition")) { [15:31:47.914] if (!is.null(pattern)) { [15:31:47.914] computeRestarts <- base::computeRestarts [15:31:47.914] grepl <- base::grepl [15:31:47.914] restarts <- computeRestarts(cond) [15:31:47.914] for (restart in restarts) { [15:31:47.914] name <- restart$name [15:31:47.914] if (is.null(name)) [15:31:47.914] next [15:31:47.914] if (!grepl(pattern, name)) [15:31:47.914] next [15:31:47.914] invokeRestart(restart) [15:31:47.914] muffled <- TRUE [15:31:47.914] break [15:31:47.914] } [15:31:47.914] } [15:31:47.914] } [15:31:47.914] invisible(muffled) [15:31:47.914] } [15:31:47.914] muffleCondition(cond, pattern = "^muffle") [15:31:47.914] } [15:31:47.914] } [15:31:47.914] } [15:31:47.914] })) [15:31:47.914] }, error = function(ex) { [15:31:47.914] base::structure(base::list(value = NULL, visible = NULL, [15:31:47.914] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:47.914] ...future.rng), started = ...future.startTime, [15:31:47.914] finished = Sys.time(), session_uuid = NA_character_, [15:31:47.914] version = "1.8"), class = "FutureResult") [15:31:47.914] }, finally = { [15:31:47.914] if (!identical(...future.workdir, getwd())) [15:31:47.914] setwd(...future.workdir) [15:31:47.914] { [15:31:47.914] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:47.914] ...future.oldOptions$nwarnings <- NULL [15:31:47.914] } [15:31:47.914] base::options(...future.oldOptions) [15:31:47.914] if (.Platform$OS.type == "windows") { [15:31:47.914] old_names <- names(...future.oldEnvVars) [15:31:47.914] envs <- base::Sys.getenv() [15:31:47.914] names <- names(envs) [15:31:47.914] common <- intersect(names, old_names) [15:31:47.914] added <- setdiff(names, old_names) [15:31:47.914] removed <- setdiff(old_names, names) [15:31:47.914] changed <- common[...future.oldEnvVars[common] != [15:31:47.914] envs[common]] [15:31:47.914] NAMES <- toupper(changed) [15:31:47.914] args <- list() [15:31:47.914] for (kk in seq_along(NAMES)) { [15:31:47.914] name <- changed[[kk]] [15:31:47.914] NAME <- NAMES[[kk]] [15:31:47.914] if (name != NAME && is.element(NAME, old_names)) [15:31:47.914] next [15:31:47.914] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:47.914] } [15:31:47.914] NAMES <- toupper(added) [15:31:47.914] for (kk in seq_along(NAMES)) { [15:31:47.914] name <- added[[kk]] [15:31:47.914] NAME <- NAMES[[kk]] [15:31:47.914] if (name != NAME && is.element(NAME, old_names)) [15:31:47.914] next [15:31:47.914] args[[name]] <- "" [15:31:47.914] } [15:31:47.914] NAMES <- toupper(removed) [15:31:47.914] for (kk in seq_along(NAMES)) { [15:31:47.914] name <- removed[[kk]] [15:31:47.914] NAME <- NAMES[[kk]] [15:31:47.914] if (name != NAME && is.element(NAME, old_names)) [15:31:47.914] next [15:31:47.914] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:47.914] } [15:31:47.914] if (length(args) > 0) [15:31:47.914] base::do.call(base::Sys.setenv, args = args) [15:31:47.914] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:47.914] } [15:31:47.914] else { [15:31:47.914] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:47.914] } [15:31:47.914] { [15:31:47.914] if (base::length(...future.futureOptionsAdded) > [15:31:47.914] 0L) { [15:31:47.914] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:47.914] base::names(opts) <- ...future.futureOptionsAdded [15:31:47.914] base::options(opts) [15:31:47.914] } [15:31:47.914] { [15:31:47.914] { [15:31:47.914] NULL [15:31:47.914] RNGkind("Mersenne-Twister") [15:31:47.914] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:47.914] inherits = FALSE) [15:31:47.914] } [15:31:47.914] options(future.plan = NULL) [15:31:47.914] if (is.na(NA_character_)) [15:31:47.914] Sys.unsetenv("R_FUTURE_PLAN") [15:31:47.914] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:47.914] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:47.914] .init = FALSE) [15:31:47.914] } [15:31:47.914] } [15:31:47.914] } [15:31:47.914] }) [15:31:47.914] if (TRUE) { [15:31:47.914] base::sink(type = "output", split = FALSE) [15:31:47.914] if (TRUE) { [15:31:47.914] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:47.914] } [15:31:47.914] else { [15:31:47.914] ...future.result["stdout"] <- base::list(NULL) [15:31:47.914] } [15:31:47.914] base::close(...future.stdout) [15:31:47.914] ...future.stdout <- NULL [15:31:47.914] } [15:31:47.914] ...future.result$conditions <- ...future.conditions [15:31:47.914] ...future.result$finished <- base::Sys.time() [15:31:47.914] ...future.result [15:31:47.914] } [15:31:47.920] assign_globals() ... [15:31:47.920] List of 5 [15:31:47.920] $ ...future.FUN :function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [15:31:47.920] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [15:31:47.920] $ future.call.arguments : list() [15:31:47.920] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:47.920] $ ...future.elements_ii :List of 2 [15:31:47.920] ..$ a: int [1:4] 1 2 3 4 [15:31:47.920] ..$ b: int [1:4] 5 6 7 8 [15:31:47.920] $ ...future.seeds_ii : NULL [15:31:47.920] $ ...future.globals.maxSize: NULL [15:31:47.920] - attr(*, "where")=List of 5 [15:31:47.920] ..$ ...future.FUN : [15:31:47.920] ..$ future.call.arguments : [15:31:47.920] ..$ ...future.elements_ii : [15:31:47.920] ..$ ...future.seeds_ii : [15:31:47.920] ..$ ...future.globals.maxSize: [15:31:47.920] - attr(*, "resolved")= logi FALSE [15:31:47.920] - attr(*, "total_size")= num 354224 [15:31:47.920] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:47.920] - attr(*, "already-done")= logi TRUE [15:31:47.930] - copied '...future.FUN' to environment [15:31:47.931] - copied 'future.call.arguments' to environment [15:31:47.931] - copied '...future.elements_ii' to environment [15:31:47.931] - copied '...future.seeds_ii' to environment [15:31:47.931] - copied '...future.globals.maxSize' to environment [15:31:47.932] assign_globals() ... done [15:31:47.932] plan(): Setting new future strategy stack: [15:31:47.933] List of future strategies: [15:31:47.933] 1. sequential: [15:31:47.933] - args: function (..., envir = parent.frame(), workers = "") [15:31:47.933] - tweaked: FALSE [15:31:47.933] - call: NULL [15:31:47.934] plan(): nbrOfWorkers() = 1 [15:31:47.936] plan(): Setting new future strategy stack: [15:31:47.937] List of future strategies: [15:31:47.937] 1. sequential: [15:31:47.937] - args: function (..., envir = parent.frame(), workers = "") [15:31:47.937] - tweaked: FALSE [15:31:47.937] - call: plan(strategy) [15:31:47.938] plan(): nbrOfWorkers() = 1 [15:31:47.938] SequentialFuture started (and completed) [15:31:47.939] - Launch lazy future ... done [15:31:47.939] run() for 'SequentialFuture' ... done [15:31:47.939] Created future: [15:31:47.940] SequentialFuture: [15:31:47.940] Label: 'future_lapply-1' [15:31:47.940] Expression: [15:31:47.940] { [15:31:47.940] do.call(function(...) { [15:31:47.940] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:47.940] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:47.940] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:47.940] on.exit(options(oopts), add = TRUE) [15:31:47.940] } [15:31:47.940] { [15:31:47.940] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:47.940] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:47.940] ...future.FUN(...future.X_jj, ...) [15:31:47.940] }) [15:31:47.940] } [15:31:47.940] }, args = future.call.arguments) [15:31:47.940] } [15:31:47.940] Lazy evaluation: FALSE [15:31:47.940] Asynchronous evaluation: FALSE [15:31:47.940] Local evaluation: TRUE [15:31:47.940] Environment: R_GlobalEnv [15:31:47.940] Capture standard output: TRUE [15:31:47.940] Capture condition classes: 'condition' (excluding 'nothing') [15:31:47.940] Globals: 5 objects totaling 346.05 KiB (function '...future.FUN' of 345.92 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 128 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:47.940] Packages: [15:31:47.940] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:47.940] Resolved: TRUE [15:31:47.940] Value: 2.27 KiB of class 'list' [15:31:47.940] Early signaling: FALSE [15:31:47.940] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:47.940] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:47.942] Chunk #1 of 1 ... DONE [15:31:47.942] Launching 1 futures (chunks) ... DONE [15:31:47.943] Resolving 1 futures (chunks) ... [15:31:47.943] resolve() on list ... [15:31:47.943] recursive: 0 [15:31:47.943] length: 1 [15:31:47.944] [15:31:47.944] resolved() for 'SequentialFuture' ... [15:31:47.944] - state: 'finished' [15:31:47.945] - run: TRUE [15:31:47.945] - result: 'FutureResult' [15:31:47.945] resolved() for 'SequentialFuture' ... done [15:31:47.946] Future #1 [15:31:47.946] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:47.946] - nx: 1 [15:31:47.946] - relay: TRUE [15:31:47.947] - stdout: TRUE [15:31:47.947] - signal: TRUE [15:31:47.947] - resignal: FALSE [15:31:47.948] - force: TRUE [15:31:47.948] - relayed: [n=1] FALSE [15:31:47.948] - queued futures: [n=1] FALSE [15:31:47.948] - until=1 [15:31:47.949] - relaying element #1 [15:31:47.949] - relayed: [n=1] TRUE [15:31:47.949] - queued futures: [n=1] TRUE [15:31:47.950] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:47.950] length: 0 (resolved future 1) [15:31:47.950] Relaying remaining futures [15:31:47.951] signalConditionsASAP(NULL, pos=0) ... [15:31:47.951] - nx: 1 [15:31:47.951] - relay: TRUE [15:31:47.951] - stdout: TRUE [15:31:47.952] - signal: TRUE [15:31:47.952] - resignal: FALSE [15:31:47.952] - force: TRUE [15:31:47.953] - relayed: [n=1] TRUE [15:31:47.953] - queued futures: [n=1] TRUE - flush all [15:31:47.953] - relayed: [n=1] TRUE [15:31:47.954] - queued futures: [n=1] TRUE [15:31:47.954] signalConditionsASAP(NULL, pos=0) ... done [15:31:47.954] resolve() on list ... DONE [15:31:47.955] - Number of value chunks collected: 1 [15:31:47.955] Resolving 1 futures (chunks) ... DONE [15:31:47.955] Reducing values from 1 chunks ... [15:31:47.955] - Number of values collected after concatenation: 2 [15:31:47.956] - Number of values expected: 2 [15:31:47.956] Reducing values from 1 chunks ... DONE [15:31:47.956] future_lapply() ... DONE - future_lapply(x, ...) where length(x) != length(as.list(x)) ... [15:31:47.957] future_lapply() ... [15:31:47.958] Number of chunks: 1 [15:31:47.958] getGlobalsAndPackagesXApply() ... [15:31:47.958] - future.globals: TRUE [15:31:47.959] getGlobalsAndPackages() ... [15:31:47.959] Searching for globals... [15:31:47.960] - globals found: [1] 'FUN' [15:31:47.961] Searching for globals ... DONE [15:31:47.961] Resolving globals: FALSE [15:31:47.962] The total size of the 1 globals is 56 bytes (56 bytes) [15:31:47.962] The total size of the 1 globals exported for future expression ('FUN()') is 56 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (56 bytes of class 'function') [15:31:47.963] - globals: [1] 'FUN' [15:31:47.963] [15:31:47.963] getGlobalsAndPackages() ... DONE [15:31:47.964] - globals found/used: [n=1] 'FUN' [15:31:47.964] - needed namespaces: [n=0] [15:31:47.964] Finding globals ... DONE [15:31:47.964] - use_args: TRUE [15:31:47.965] - Getting '...' globals ... [15:31:47.965] resolve() on list ... [15:31:47.966] recursive: 0 [15:31:47.966] length: 1 [15:31:47.966] elements: '...' [15:31:47.967] length: 0 (resolved future 1) [15:31:47.967] resolve() on list ... DONE [15:31:47.967] - '...' content: [n=0] [15:31:47.967] List of 1 [15:31:47.967] $ ...: list() [15:31:47.967] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:47.967] - attr(*, "where")=List of 1 [15:31:47.967] ..$ ...: [15:31:47.967] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:47.967] - attr(*, "resolved")= logi TRUE [15:31:47.967] - attr(*, "total_size")= num NA [15:31:47.973] - Getting '...' globals ... DONE [15:31:47.973] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:47.973] List of 2 [15:31:47.973] $ ...future.FUN:function (x) [15:31:47.973] $ ... : list() [15:31:47.973] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:47.973] - attr(*, "where")=List of 2 [15:31:47.973] ..$ ...future.FUN: [15:31:47.973] ..$ ... : [15:31:47.973] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:47.973] - attr(*, "resolved")= logi FALSE [15:31:47.973] - attr(*, "total_size")= num 56 [15:31:47.979] Packages to be attached in all futures: [n=0] [15:31:47.979] getGlobalsAndPackagesXApply() ... DONE [15:31:47.980] Number of futures (= number of chunks): 1 [15:31:47.980] Launching 1 futures (chunks) ... [15:31:47.980] Chunk #1 of 1 ... [15:31:47.981] - Finding globals in 'X' for chunk #1 ... [15:31:47.981] getGlobalsAndPackages() ... [15:31:47.981] Searching for globals... [15:31:47.982] [15:31:47.982] Searching for globals ... DONE [15:31:47.982] - globals: [0] [15:31:47.983] getGlobalsAndPackages() ... DONE [15:31:47.983] + additional globals found: [n=0] [15:31:47.983] + additional namespaces needed: [n=0] [15:31:47.983] - Finding globals in 'X' for chunk #1 ... DONE [15:31:47.984] - seeds: [15:31:47.984] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:47.984] getGlobalsAndPackages() ... [15:31:47.985] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:47.985] Resolving globals: FALSE [15:31:47.985] Tweak future expression to call with '...' arguments ... [15:31:47.986] { [15:31:47.986] do.call(function(...) { [15:31:47.986] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:47.986] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:47.986] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:47.986] on.exit(options(oopts), add = TRUE) [15:31:47.986] } [15:31:47.986] { [15:31:47.986] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:47.986] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:47.986] ...future.FUN(...future.X_jj, ...) [15:31:47.986] }) [15:31:47.986] } [15:31:47.986] }, args = future.call.arguments) [15:31:47.986] } [15:31:47.986] Tweak future expression to call with '...' arguments ... DONE [15:31:47.987] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:47.988] [15:31:47.988] getGlobalsAndPackages() ... DONE [15:31:47.989] run() for 'Future' ... [15:31:47.989] - state: 'created' [15:31:47.989] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:47.990] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:47.990] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:47.991] - Field: 'label' [15:31:47.991] - Field: 'local' [15:31:47.991] - Field: 'owner' [15:31:47.992] - Field: 'envir' [15:31:47.992] - Field: 'packages' [15:31:47.992] - Field: 'gc' [15:31:47.992] - Field: 'conditions' [15:31:47.993] - Field: 'expr' [15:31:47.993] - Field: 'uuid' [15:31:47.993] - Field: 'seed' [15:31:47.994] - Field: 'version' [15:31:47.994] - Field: 'result' [15:31:47.994] - Field: 'asynchronous' [15:31:47.995] - Field: 'calls' [15:31:47.995] - Field: 'globals' [15:31:47.995] - Field: 'stdout' [15:31:47.996] - Field: 'earlySignal' [15:31:47.996] - Field: 'lazy' [15:31:47.996] - Field: 'state' [15:31:47.997] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:47.997] - Launch lazy future ... [15:31:47.997] Packages needed by the future expression (n = 0): [15:31:47.998] Packages needed by future strategies (n = 0): [15:31:47.999] { [15:31:47.999] { [15:31:47.999] { [15:31:47.999] ...future.startTime <- base::Sys.time() [15:31:47.999] { [15:31:47.999] { [15:31:47.999] { [15:31:47.999] base::local({ [15:31:47.999] has_future <- base::requireNamespace("future", [15:31:47.999] quietly = TRUE) [15:31:47.999] if (has_future) { [15:31:47.999] ns <- base::getNamespace("future") [15:31:47.999] version <- ns[[".package"]][["version"]] [15:31:47.999] if (is.null(version)) [15:31:47.999] version <- utils::packageVersion("future") [15:31:47.999] } [15:31:47.999] else { [15:31:47.999] version <- NULL [15:31:47.999] } [15:31:47.999] if (!has_future || version < "1.8.0") { [15:31:47.999] info <- base::c(r_version = base::gsub("R version ", [15:31:47.999] "", base::R.version$version.string), [15:31:47.999] platform = base::sprintf("%s (%s-bit)", [15:31:47.999] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:47.999] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:47.999] "release", "version")], collapse = " "), [15:31:47.999] hostname = base::Sys.info()[["nodename"]]) [15:31:47.999] info <- base::sprintf("%s: %s", base::names(info), [15:31:47.999] info) [15:31:47.999] info <- base::paste(info, collapse = "; ") [15:31:47.999] if (!has_future) { [15:31:47.999] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:47.999] info) [15:31:47.999] } [15:31:47.999] else { [15:31:47.999] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:47.999] info, version) [15:31:47.999] } [15:31:47.999] base::stop(msg) [15:31:47.999] } [15:31:47.999] }) [15:31:47.999] } [15:31:47.999] ...future.strategy.old <- future::plan("list") [15:31:47.999] options(future.plan = NULL) [15:31:47.999] Sys.unsetenv("R_FUTURE_PLAN") [15:31:47.999] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:47.999] } [15:31:47.999] ...future.workdir <- getwd() [15:31:47.999] } [15:31:47.999] ...future.oldOptions <- base::as.list(base::.Options) [15:31:47.999] ...future.oldEnvVars <- base::Sys.getenv() [15:31:47.999] } [15:31:47.999] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:47.999] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:47.999] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:47.999] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:47.999] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:47.999] future.stdout.windows.reencode = NULL, width = 80L) [15:31:47.999] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:47.999] base::names(...future.oldOptions)) [15:31:47.999] } [15:31:47.999] if (FALSE) { [15:31:47.999] } [15:31:47.999] else { [15:31:47.999] if (TRUE) { [15:31:47.999] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:47.999] open = "w") [15:31:47.999] } [15:31:47.999] else { [15:31:47.999] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:47.999] windows = "NUL", "/dev/null"), open = "w") [15:31:47.999] } [15:31:47.999] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:47.999] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:47.999] base::sink(type = "output", split = FALSE) [15:31:47.999] base::close(...future.stdout) [15:31:47.999] }, add = TRUE) [15:31:47.999] } [15:31:47.999] ...future.frame <- base::sys.nframe() [15:31:47.999] ...future.conditions <- base::list() [15:31:47.999] ...future.rng <- base::globalenv()$.Random.seed [15:31:47.999] if (FALSE) { [15:31:47.999] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:47.999] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:47.999] } [15:31:47.999] ...future.result <- base::tryCatch({ [15:31:47.999] base::withCallingHandlers({ [15:31:47.999] ...future.value <- base::withVisible(base::local({ [15:31:47.999] do.call(function(...) { [15:31:47.999] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:47.999] if (!identical(...future.globals.maxSize.org, [15:31:47.999] ...future.globals.maxSize)) { [15:31:47.999] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:47.999] on.exit(options(oopts), add = TRUE) [15:31:47.999] } [15:31:47.999] { [15:31:47.999] lapply(seq_along(...future.elements_ii), [15:31:47.999] FUN = function(jj) { [15:31:47.999] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:47.999] ...future.FUN(...future.X_jj, ...) [15:31:47.999] }) [15:31:47.999] } [15:31:47.999] }, args = future.call.arguments) [15:31:47.999] })) [15:31:47.999] future::FutureResult(value = ...future.value$value, [15:31:47.999] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:47.999] ...future.rng), globalenv = if (FALSE) [15:31:47.999] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:47.999] ...future.globalenv.names)) [15:31:47.999] else NULL, started = ...future.startTime, version = "1.8") [15:31:47.999] }, condition = base::local({ [15:31:47.999] c <- base::c [15:31:47.999] inherits <- base::inherits [15:31:47.999] invokeRestart <- base::invokeRestart [15:31:47.999] length <- base::length [15:31:47.999] list <- base::list [15:31:47.999] seq.int <- base::seq.int [15:31:47.999] signalCondition <- base::signalCondition [15:31:47.999] sys.calls <- base::sys.calls [15:31:47.999] `[[` <- base::`[[` [15:31:47.999] `+` <- base::`+` [15:31:47.999] `<<-` <- base::`<<-` [15:31:47.999] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:47.999] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:47.999] 3L)] [15:31:47.999] } [15:31:47.999] function(cond) { [15:31:47.999] is_error <- inherits(cond, "error") [15:31:47.999] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:47.999] NULL) [15:31:47.999] if (is_error) { [15:31:47.999] sessionInformation <- function() { [15:31:47.999] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:47.999] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:47.999] search = base::search(), system = base::Sys.info()) [15:31:47.999] } [15:31:47.999] ...future.conditions[[length(...future.conditions) + [15:31:47.999] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:47.999] cond$call), session = sessionInformation(), [15:31:47.999] timestamp = base::Sys.time(), signaled = 0L) [15:31:47.999] signalCondition(cond) [15:31:47.999] } [15:31:47.999] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:47.999] "immediateCondition"))) { [15:31:47.999] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:47.999] ...future.conditions[[length(...future.conditions) + [15:31:47.999] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:47.999] if (TRUE && !signal) { [15:31:47.999] muffleCondition <- function (cond, pattern = "^muffle") [15:31:47.999] { [15:31:47.999] inherits <- base::inherits [15:31:47.999] invokeRestart <- base::invokeRestart [15:31:47.999] is.null <- base::is.null [15:31:47.999] muffled <- FALSE [15:31:47.999] if (inherits(cond, "message")) { [15:31:47.999] muffled <- grepl(pattern, "muffleMessage") [15:31:47.999] if (muffled) [15:31:47.999] invokeRestart("muffleMessage") [15:31:47.999] } [15:31:47.999] else if (inherits(cond, "warning")) { [15:31:47.999] muffled <- grepl(pattern, "muffleWarning") [15:31:47.999] if (muffled) [15:31:47.999] invokeRestart("muffleWarning") [15:31:47.999] } [15:31:47.999] else if (inherits(cond, "condition")) { [15:31:47.999] if (!is.null(pattern)) { [15:31:47.999] computeRestarts <- base::computeRestarts [15:31:47.999] grepl <- base::grepl [15:31:47.999] restarts <- computeRestarts(cond) [15:31:47.999] for (restart in restarts) { [15:31:47.999] name <- restart$name [15:31:47.999] if (is.null(name)) [15:31:47.999] next [15:31:47.999] if (!grepl(pattern, name)) [15:31:47.999] next [15:31:47.999] invokeRestart(restart) [15:31:47.999] muffled <- TRUE [15:31:47.999] break [15:31:47.999] } [15:31:47.999] } [15:31:47.999] } [15:31:47.999] invisible(muffled) [15:31:47.999] } [15:31:47.999] muffleCondition(cond, pattern = "^muffle") [15:31:47.999] } [15:31:47.999] } [15:31:47.999] else { [15:31:47.999] if (TRUE) { [15:31:47.999] muffleCondition <- function (cond, pattern = "^muffle") [15:31:47.999] { [15:31:47.999] inherits <- base::inherits [15:31:47.999] invokeRestart <- base::invokeRestart [15:31:47.999] is.null <- base::is.null [15:31:47.999] muffled <- FALSE [15:31:47.999] if (inherits(cond, "message")) { [15:31:47.999] muffled <- grepl(pattern, "muffleMessage") [15:31:47.999] if (muffled) [15:31:47.999] invokeRestart("muffleMessage") [15:31:47.999] } [15:31:47.999] else if (inherits(cond, "warning")) { [15:31:47.999] muffled <- grepl(pattern, "muffleWarning") [15:31:47.999] if (muffled) [15:31:47.999] invokeRestart("muffleWarning") [15:31:47.999] } [15:31:47.999] else if (inherits(cond, "condition")) { [15:31:47.999] if (!is.null(pattern)) { [15:31:47.999] computeRestarts <- base::computeRestarts [15:31:47.999] grepl <- base::grepl [15:31:47.999] restarts <- computeRestarts(cond) [15:31:47.999] for (restart in restarts) { [15:31:47.999] name <- restart$name [15:31:47.999] if (is.null(name)) [15:31:47.999] next [15:31:47.999] if (!grepl(pattern, name)) [15:31:47.999] next [15:31:47.999] invokeRestart(restart) [15:31:47.999] muffled <- TRUE [15:31:47.999] break [15:31:47.999] } [15:31:47.999] } [15:31:47.999] } [15:31:47.999] invisible(muffled) [15:31:47.999] } [15:31:47.999] muffleCondition(cond, pattern = "^muffle") [15:31:47.999] } [15:31:47.999] } [15:31:47.999] } [15:31:47.999] })) [15:31:47.999] }, error = function(ex) { [15:31:47.999] base::structure(base::list(value = NULL, visible = NULL, [15:31:47.999] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:47.999] ...future.rng), started = ...future.startTime, [15:31:47.999] finished = Sys.time(), session_uuid = NA_character_, [15:31:47.999] version = "1.8"), class = "FutureResult") [15:31:47.999] }, finally = { [15:31:47.999] if (!identical(...future.workdir, getwd())) [15:31:47.999] setwd(...future.workdir) [15:31:47.999] { [15:31:47.999] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:47.999] ...future.oldOptions$nwarnings <- NULL [15:31:47.999] } [15:31:47.999] base::options(...future.oldOptions) [15:31:47.999] if (.Platform$OS.type == "windows") { [15:31:47.999] old_names <- names(...future.oldEnvVars) [15:31:47.999] envs <- base::Sys.getenv() [15:31:47.999] names <- names(envs) [15:31:47.999] common <- intersect(names, old_names) [15:31:47.999] added <- setdiff(names, old_names) [15:31:47.999] removed <- setdiff(old_names, names) [15:31:47.999] changed <- common[...future.oldEnvVars[common] != [15:31:47.999] envs[common]] [15:31:47.999] NAMES <- toupper(changed) [15:31:47.999] args <- list() [15:31:47.999] for (kk in seq_along(NAMES)) { [15:31:47.999] name <- changed[[kk]] [15:31:47.999] NAME <- NAMES[[kk]] [15:31:47.999] if (name != NAME && is.element(NAME, old_names)) [15:31:47.999] next [15:31:47.999] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:47.999] } [15:31:47.999] NAMES <- toupper(added) [15:31:47.999] for (kk in seq_along(NAMES)) { [15:31:47.999] name <- added[[kk]] [15:31:47.999] NAME <- NAMES[[kk]] [15:31:47.999] if (name != NAME && is.element(NAME, old_names)) [15:31:47.999] next [15:31:47.999] args[[name]] <- "" [15:31:47.999] } [15:31:47.999] NAMES <- toupper(removed) [15:31:47.999] for (kk in seq_along(NAMES)) { [15:31:47.999] name <- removed[[kk]] [15:31:47.999] NAME <- NAMES[[kk]] [15:31:47.999] if (name != NAME && is.element(NAME, old_names)) [15:31:47.999] next [15:31:47.999] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:47.999] } [15:31:47.999] if (length(args) > 0) [15:31:47.999] base::do.call(base::Sys.setenv, args = args) [15:31:47.999] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:47.999] } [15:31:47.999] else { [15:31:47.999] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:47.999] } [15:31:47.999] { [15:31:47.999] if (base::length(...future.futureOptionsAdded) > [15:31:47.999] 0L) { [15:31:47.999] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:47.999] base::names(opts) <- ...future.futureOptionsAdded [15:31:47.999] base::options(opts) [15:31:47.999] } [15:31:47.999] { [15:31:47.999] { [15:31:47.999] NULL [15:31:47.999] RNGkind("Mersenne-Twister") [15:31:47.999] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:47.999] inherits = FALSE) [15:31:47.999] } [15:31:47.999] options(future.plan = NULL) [15:31:47.999] if (is.na(NA_character_)) [15:31:47.999] Sys.unsetenv("R_FUTURE_PLAN") [15:31:47.999] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:47.999] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:47.999] .init = FALSE) [15:31:47.999] } [15:31:47.999] } [15:31:47.999] } [15:31:47.999] }) [15:31:47.999] if (TRUE) { [15:31:47.999] base::sink(type = "output", split = FALSE) [15:31:47.999] if (TRUE) { [15:31:47.999] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:47.999] } [15:31:47.999] else { [15:31:47.999] ...future.result["stdout"] <- base::list(NULL) [15:31:47.999] } [15:31:47.999] base::close(...future.stdout) [15:31:47.999] ...future.stdout <- NULL [15:31:47.999] } [15:31:47.999] ...future.result$conditions <- ...future.conditions [15:31:47.999] ...future.result$finished <- base::Sys.time() [15:31:47.999] ...future.result [15:31:47.999] } [15:31:48.006] assign_globals() ... [15:31:48.006] List of 5 [15:31:48.006] $ ...future.FUN :function (x) [15:31:48.006] $ future.call.arguments : list() [15:31:48.006] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:48.006] $ ...future.elements_ii :List of 3 [15:31:48.006] ..$ a: num 1 [15:31:48.006] ..$ b: num 2 [15:31:48.006] ..$ c: num 3 [15:31:48.006] $ ...future.seeds_ii : NULL [15:31:48.006] $ ...future.globals.maxSize: NULL [15:31:48.006] - attr(*, "where")=List of 5 [15:31:48.006] ..$ ...future.FUN : [15:31:48.006] ..$ future.call.arguments : [15:31:48.006] ..$ ...future.elements_ii : [15:31:48.006] ..$ ...future.seeds_ii : [15:31:48.006] ..$ ...future.globals.maxSize: [15:31:48.006] - attr(*, "resolved")= logi FALSE [15:31:48.006] - attr(*, "total_size")= num 56 [15:31:48.006] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:48.006] - attr(*, "already-done")= logi TRUE [15:31:48.020] - copied '...future.FUN' to environment [15:31:48.020] - copied 'future.call.arguments' to environment [15:31:48.021] - copied '...future.elements_ii' to environment [15:31:48.021] - copied '...future.seeds_ii' to environment [15:31:48.021] - copied '...future.globals.maxSize' to environment [15:31:48.021] assign_globals() ... done [15:31:48.022] plan(): Setting new future strategy stack: [15:31:48.022] List of future strategies: [15:31:48.022] 1. sequential: [15:31:48.022] - args: function (..., envir = parent.frame(), workers = "") [15:31:48.022] - tweaked: FALSE [15:31:48.022] - call: NULL [15:31:48.023] plan(): nbrOfWorkers() = 1 [15:31:48.025] plan(): Setting new future strategy stack: [15:31:48.026] List of future strategies: [15:31:48.026] 1. sequential: [15:31:48.026] - args: function (..., envir = parent.frame(), workers = "") [15:31:48.026] - tweaked: FALSE [15:31:48.026] - call: plan(strategy) [15:31:48.027] plan(): nbrOfWorkers() = 1 [15:31:48.027] SequentialFuture started (and completed) [15:31:48.028] - Launch lazy future ... done [15:31:48.028] run() for 'SequentialFuture' ... done [15:31:48.028] Created future: [15:31:48.028] SequentialFuture: [15:31:48.028] Label: 'future_lapply-1' [15:31:48.028] Expression: [15:31:48.028] { [15:31:48.028] do.call(function(...) { [15:31:48.028] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.028] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.028] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.028] on.exit(options(oopts), add = TRUE) [15:31:48.028] } [15:31:48.028] { [15:31:48.028] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.028] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.028] ...future.FUN(...future.X_jj, ...) [15:31:48.028] }) [15:31:48.028] } [15:31:48.028] }, args = future.call.arguments) [15:31:48.028] } [15:31:48.028] Lazy evaluation: FALSE [15:31:48.028] Asynchronous evaluation: FALSE [15:31:48.028] Local evaluation: TRUE [15:31:48.028] Environment: R_GlobalEnv [15:31:48.028] Capture standard output: TRUE [15:31:48.028] Capture condition classes: 'condition' (excluding 'nothing') [15:31:48.028] Globals: 5 objects totaling 224 bytes (function '...future.FUN' of 56 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 168 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:48.028] Packages: [15:31:48.028] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:48.028] Resolved: TRUE [15:31:48.028] Value: 168 bytes of class 'list' [15:31:48.028] Early signaling: FALSE [15:31:48.028] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:48.028] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.031] Chunk #1 of 1 ... DONE [15:31:48.031] Launching 1 futures (chunks) ... DONE [15:31:48.031] Resolving 1 futures (chunks) ... [15:31:48.032] resolve() on list ... [15:31:48.032] recursive: 0 [15:31:48.032] length: 1 [15:31:48.032] [15:31:48.033] resolved() for 'SequentialFuture' ... [15:31:48.033] - state: 'finished' [15:31:48.033] - run: TRUE [15:31:48.033] - result: 'FutureResult' [15:31:48.034] resolved() for 'SequentialFuture' ... done [15:31:48.034] Future #1 [15:31:48.034] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:48.035] - nx: 1 [15:31:48.035] - relay: TRUE [15:31:48.035] - stdout: TRUE [15:31:48.035] - signal: TRUE [15:31:48.036] - resignal: FALSE [15:31:48.036] - force: TRUE [15:31:48.036] - relayed: [n=1] FALSE [15:31:48.036] - queued futures: [n=1] FALSE [15:31:48.037] - until=1 [15:31:48.037] - relaying element #1 [15:31:48.037] - relayed: [n=1] TRUE [15:31:48.038] - queued futures: [n=1] TRUE [15:31:48.038] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:48.038] length: 0 (resolved future 1) [15:31:48.039] Relaying remaining futures [15:31:48.039] signalConditionsASAP(NULL, pos=0) ... [15:31:48.039] - nx: 1 [15:31:48.039] - relay: TRUE [15:31:48.040] - stdout: TRUE [15:31:48.040] - signal: TRUE [15:31:48.040] - resignal: FALSE [15:31:48.040] - force: TRUE [15:31:48.041] - relayed: [n=1] TRUE [15:31:48.041] - queued futures: [n=1] TRUE - flush all [15:31:48.041] - relayed: [n=1] TRUE [15:31:48.041] - queued futures: [n=1] TRUE [15:31:48.042] signalConditionsASAP(NULL, pos=0) ... done [15:31:48.042] resolve() on list ... DONE [15:31:48.042] - Number of value chunks collected: 1 [15:31:48.043] Resolving 1 futures (chunks) ... DONE [15:31:48.043] Reducing values from 1 chunks ... [15:31:48.043] - Number of values collected after concatenation: 3 [15:31:48.043] - Number of values expected: 3 [15:31:48.044] Reducing values from 1 chunks ... DONE [15:31:48.044] future_lapply() ... DONE - future_lapply(x, ...) where x[[i]] subsets via S3 method ... [15:31:48.044] future_lapply() ... [15:31:48.045] Number of chunks: 1 [15:31:48.046] getGlobalsAndPackagesXApply() ... [15:31:48.046] - future.globals: TRUE [15:31:48.046] getGlobalsAndPackages() ... [15:31:48.047] Searching for globals... [15:31:48.048] - globals found: [1] 'FUN' [15:31:48.049] Searching for globals ... DONE [15:31:48.049] Resolving globals: FALSE [15:31:48.050] The total size of the 1 globals is 848 bytes (848 bytes) [15:31:48.051] The total size of the 1 globals exported for future expression ('FUN()') is 848 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (848 bytes of class 'function') [15:31:48.051] - globals: [1] 'FUN' [15:31:48.051] [15:31:48.051] getGlobalsAndPackages() ... DONE [15:31:48.052] - globals found/used: [n=1] 'FUN' [15:31:48.052] - needed namespaces: [n=0] [15:31:48.052] Finding globals ... DONE [15:31:48.052] - use_args: TRUE [15:31:48.053] - Getting '...' globals ... [15:31:48.053] resolve() on list ... [15:31:48.054] recursive: 0 [15:31:48.054] length: 1 [15:31:48.054] elements: '...' [15:31:48.054] length: 0 (resolved future 1) [15:31:48.055] resolve() on list ... DONE [15:31:48.055] - '...' content: [n=0] [15:31:48.055] List of 1 [15:31:48.055] $ ...: list() [15:31:48.055] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:48.055] - attr(*, "where")=List of 1 [15:31:48.055] ..$ ...: [15:31:48.055] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:48.055] - attr(*, "resolved")= logi TRUE [15:31:48.055] - attr(*, "total_size")= num NA [15:31:48.060] - Getting '...' globals ... DONE [15:31:48.061] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:48.061] List of 2 [15:31:48.061] $ ...future.FUN:function (x) [15:31:48.061] $ ... : list() [15:31:48.061] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:48.061] - attr(*, "where")=List of 2 [15:31:48.061] ..$ ...future.FUN: [15:31:48.061] ..$ ... : [15:31:48.061] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:48.061] - attr(*, "resolved")= logi FALSE [15:31:48.061] - attr(*, "total_size")= num 848 [15:31:48.066] Packages to be attached in all futures: [n=0] [15:31:48.066] getGlobalsAndPackagesXApply() ... DONE [15:31:48.067] Number of futures (= number of chunks): 1 [15:31:48.067] Launching 1 futures (chunks) ... [15:31:48.067] Chunk #1 of 1 ... [15:31:48.068] - Finding globals in 'X' for chunk #1 ... [15:31:48.068] getGlobalsAndPackages() ... [15:31:48.068] Searching for globals... [15:31:48.069] [15:31:48.069] Searching for globals ... DONE [15:31:48.069] - globals: [0] [15:31:48.069] getGlobalsAndPackages() ... DONE [15:31:48.070] + additional globals found: [n=0] [15:31:48.070] + additional namespaces needed: [n=0] [15:31:48.070] - Finding globals in 'X' for chunk #1 ... DONE [15:31:48.071] - seeds: [15:31:48.071] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.071] getGlobalsAndPackages() ... [15:31:48.071] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.072] Resolving globals: FALSE [15:31:48.072] Tweak future expression to call with '...' arguments ... [15:31:48.072] { [15:31:48.072] do.call(function(...) { [15:31:48.072] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.072] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.072] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.072] on.exit(options(oopts), add = TRUE) [15:31:48.072] } [15:31:48.072] { [15:31:48.072] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.072] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.072] ...future.FUN(...future.X_jj, ...) [15:31:48.072] }) [15:31:48.072] } [15:31:48.072] }, args = future.call.arguments) [15:31:48.072] } [15:31:48.073] Tweak future expression to call with '...' arguments ... DONE [15:31:48.074] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.074] [15:31:48.074] getGlobalsAndPackages() ... DONE [15:31:48.075] run() for 'Future' ... [15:31:48.075] - state: 'created' [15:31:48.076] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:48.076] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.077] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:48.077] - Field: 'label' [15:31:48.077] - Field: 'local' [15:31:48.077] - Field: 'owner' [15:31:48.078] - Field: 'envir' [15:31:48.078] - Field: 'packages' [15:31:48.078] - Field: 'gc' [15:31:48.079] - Field: 'conditions' [15:31:48.079] - Field: 'expr' [15:31:48.079] - Field: 'uuid' [15:31:48.079] - Field: 'seed' [15:31:48.080] - Field: 'version' [15:31:48.080] - Field: 'result' [15:31:48.080] - Field: 'asynchronous' [15:31:48.081] - Field: 'calls' [15:31:48.081] - Field: 'globals' [15:31:48.081] - Field: 'stdout' [15:31:48.081] - Field: 'earlySignal' [15:31:48.082] - Field: 'lazy' [15:31:48.082] - Field: 'state' [15:31:48.082] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:48.083] - Launch lazy future ... [15:31:48.083] Packages needed by the future expression (n = 0): [15:31:48.083] Packages needed by future strategies (n = 0): [15:31:48.084] { [15:31:48.084] { [15:31:48.084] { [15:31:48.084] ...future.startTime <- base::Sys.time() [15:31:48.084] { [15:31:48.084] { [15:31:48.084] { [15:31:48.084] base::local({ [15:31:48.084] has_future <- base::requireNamespace("future", [15:31:48.084] quietly = TRUE) [15:31:48.084] if (has_future) { [15:31:48.084] ns <- base::getNamespace("future") [15:31:48.084] version <- ns[[".package"]][["version"]] [15:31:48.084] if (is.null(version)) [15:31:48.084] version <- utils::packageVersion("future") [15:31:48.084] } [15:31:48.084] else { [15:31:48.084] version <- NULL [15:31:48.084] } [15:31:48.084] if (!has_future || version < "1.8.0") { [15:31:48.084] info <- base::c(r_version = base::gsub("R version ", [15:31:48.084] "", base::R.version$version.string), [15:31:48.084] platform = base::sprintf("%s (%s-bit)", [15:31:48.084] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:48.084] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:48.084] "release", "version")], collapse = " "), [15:31:48.084] hostname = base::Sys.info()[["nodename"]]) [15:31:48.084] info <- base::sprintf("%s: %s", base::names(info), [15:31:48.084] info) [15:31:48.084] info <- base::paste(info, collapse = "; ") [15:31:48.084] if (!has_future) { [15:31:48.084] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:48.084] info) [15:31:48.084] } [15:31:48.084] else { [15:31:48.084] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:48.084] info, version) [15:31:48.084] } [15:31:48.084] base::stop(msg) [15:31:48.084] } [15:31:48.084] }) [15:31:48.084] } [15:31:48.084] ...future.strategy.old <- future::plan("list") [15:31:48.084] options(future.plan = NULL) [15:31:48.084] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.084] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:48.084] } [15:31:48.084] ...future.workdir <- getwd() [15:31:48.084] } [15:31:48.084] ...future.oldOptions <- base::as.list(base::.Options) [15:31:48.084] ...future.oldEnvVars <- base::Sys.getenv() [15:31:48.084] } [15:31:48.084] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:48.084] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:48.084] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:48.084] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:48.084] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:48.084] future.stdout.windows.reencode = NULL, width = 80L) [15:31:48.084] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:48.084] base::names(...future.oldOptions)) [15:31:48.084] } [15:31:48.084] if (FALSE) { [15:31:48.084] } [15:31:48.084] else { [15:31:48.084] if (TRUE) { [15:31:48.084] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:48.084] open = "w") [15:31:48.084] } [15:31:48.084] else { [15:31:48.084] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:48.084] windows = "NUL", "/dev/null"), open = "w") [15:31:48.084] } [15:31:48.084] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:48.084] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:48.084] base::sink(type = "output", split = FALSE) [15:31:48.084] base::close(...future.stdout) [15:31:48.084] }, add = TRUE) [15:31:48.084] } [15:31:48.084] ...future.frame <- base::sys.nframe() [15:31:48.084] ...future.conditions <- base::list() [15:31:48.084] ...future.rng <- base::globalenv()$.Random.seed [15:31:48.084] if (FALSE) { [15:31:48.084] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:48.084] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:48.084] } [15:31:48.084] ...future.result <- base::tryCatch({ [15:31:48.084] base::withCallingHandlers({ [15:31:48.084] ...future.value <- base::withVisible(base::local({ [15:31:48.084] do.call(function(...) { [15:31:48.084] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.084] if (!identical(...future.globals.maxSize.org, [15:31:48.084] ...future.globals.maxSize)) { [15:31:48.084] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.084] on.exit(options(oopts), add = TRUE) [15:31:48.084] } [15:31:48.084] { [15:31:48.084] lapply(seq_along(...future.elements_ii), [15:31:48.084] FUN = function(jj) { [15:31:48.084] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.084] ...future.FUN(...future.X_jj, ...) [15:31:48.084] }) [15:31:48.084] } [15:31:48.084] }, args = future.call.arguments) [15:31:48.084] })) [15:31:48.084] future::FutureResult(value = ...future.value$value, [15:31:48.084] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.084] ...future.rng), globalenv = if (FALSE) [15:31:48.084] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:48.084] ...future.globalenv.names)) [15:31:48.084] else NULL, started = ...future.startTime, version = "1.8") [15:31:48.084] }, condition = base::local({ [15:31:48.084] c <- base::c [15:31:48.084] inherits <- base::inherits [15:31:48.084] invokeRestart <- base::invokeRestart [15:31:48.084] length <- base::length [15:31:48.084] list <- base::list [15:31:48.084] seq.int <- base::seq.int [15:31:48.084] signalCondition <- base::signalCondition [15:31:48.084] sys.calls <- base::sys.calls [15:31:48.084] `[[` <- base::`[[` [15:31:48.084] `+` <- base::`+` [15:31:48.084] `<<-` <- base::`<<-` [15:31:48.084] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:48.084] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:48.084] 3L)] [15:31:48.084] } [15:31:48.084] function(cond) { [15:31:48.084] is_error <- inherits(cond, "error") [15:31:48.084] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:48.084] NULL) [15:31:48.084] if (is_error) { [15:31:48.084] sessionInformation <- function() { [15:31:48.084] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:48.084] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:48.084] search = base::search(), system = base::Sys.info()) [15:31:48.084] } [15:31:48.084] ...future.conditions[[length(...future.conditions) + [15:31:48.084] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:48.084] cond$call), session = sessionInformation(), [15:31:48.084] timestamp = base::Sys.time(), signaled = 0L) [15:31:48.084] signalCondition(cond) [15:31:48.084] } [15:31:48.084] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:48.084] "immediateCondition"))) { [15:31:48.084] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:48.084] ...future.conditions[[length(...future.conditions) + [15:31:48.084] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:48.084] if (TRUE && !signal) { [15:31:48.084] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.084] { [15:31:48.084] inherits <- base::inherits [15:31:48.084] invokeRestart <- base::invokeRestart [15:31:48.084] is.null <- base::is.null [15:31:48.084] muffled <- FALSE [15:31:48.084] if (inherits(cond, "message")) { [15:31:48.084] muffled <- grepl(pattern, "muffleMessage") [15:31:48.084] if (muffled) [15:31:48.084] invokeRestart("muffleMessage") [15:31:48.084] } [15:31:48.084] else if (inherits(cond, "warning")) { [15:31:48.084] muffled <- grepl(pattern, "muffleWarning") [15:31:48.084] if (muffled) [15:31:48.084] invokeRestart("muffleWarning") [15:31:48.084] } [15:31:48.084] else if (inherits(cond, "condition")) { [15:31:48.084] if (!is.null(pattern)) { [15:31:48.084] computeRestarts <- base::computeRestarts [15:31:48.084] grepl <- base::grepl [15:31:48.084] restarts <- computeRestarts(cond) [15:31:48.084] for (restart in restarts) { [15:31:48.084] name <- restart$name [15:31:48.084] if (is.null(name)) [15:31:48.084] next [15:31:48.084] if (!grepl(pattern, name)) [15:31:48.084] next [15:31:48.084] invokeRestart(restart) [15:31:48.084] muffled <- TRUE [15:31:48.084] break [15:31:48.084] } [15:31:48.084] } [15:31:48.084] } [15:31:48.084] invisible(muffled) [15:31:48.084] } [15:31:48.084] muffleCondition(cond, pattern = "^muffle") [15:31:48.084] } [15:31:48.084] } [15:31:48.084] else { [15:31:48.084] if (TRUE) { [15:31:48.084] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.084] { [15:31:48.084] inherits <- base::inherits [15:31:48.084] invokeRestart <- base::invokeRestart [15:31:48.084] is.null <- base::is.null [15:31:48.084] muffled <- FALSE [15:31:48.084] if (inherits(cond, "message")) { [15:31:48.084] muffled <- grepl(pattern, "muffleMessage") [15:31:48.084] if (muffled) [15:31:48.084] invokeRestart("muffleMessage") [15:31:48.084] } [15:31:48.084] else if (inherits(cond, "warning")) { [15:31:48.084] muffled <- grepl(pattern, "muffleWarning") [15:31:48.084] if (muffled) [15:31:48.084] invokeRestart("muffleWarning") [15:31:48.084] } [15:31:48.084] else if (inherits(cond, "condition")) { [15:31:48.084] if (!is.null(pattern)) { [15:31:48.084] computeRestarts <- base::computeRestarts [15:31:48.084] grepl <- base::grepl [15:31:48.084] restarts <- computeRestarts(cond) [15:31:48.084] for (restart in restarts) { [15:31:48.084] name <- restart$name [15:31:48.084] if (is.null(name)) [15:31:48.084] next [15:31:48.084] if (!grepl(pattern, name)) [15:31:48.084] next [15:31:48.084] invokeRestart(restart) [15:31:48.084] muffled <- TRUE [15:31:48.084] break [15:31:48.084] } [15:31:48.084] } [15:31:48.084] } [15:31:48.084] invisible(muffled) [15:31:48.084] } [15:31:48.084] muffleCondition(cond, pattern = "^muffle") [15:31:48.084] } [15:31:48.084] } [15:31:48.084] } [15:31:48.084] })) [15:31:48.084] }, error = function(ex) { [15:31:48.084] base::structure(base::list(value = NULL, visible = NULL, [15:31:48.084] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.084] ...future.rng), started = ...future.startTime, [15:31:48.084] finished = Sys.time(), session_uuid = NA_character_, [15:31:48.084] version = "1.8"), class = "FutureResult") [15:31:48.084] }, finally = { [15:31:48.084] if (!identical(...future.workdir, getwd())) [15:31:48.084] setwd(...future.workdir) [15:31:48.084] { [15:31:48.084] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:48.084] ...future.oldOptions$nwarnings <- NULL [15:31:48.084] } [15:31:48.084] base::options(...future.oldOptions) [15:31:48.084] if (.Platform$OS.type == "windows") { [15:31:48.084] old_names <- names(...future.oldEnvVars) [15:31:48.084] envs <- base::Sys.getenv() [15:31:48.084] names <- names(envs) [15:31:48.084] common <- intersect(names, old_names) [15:31:48.084] added <- setdiff(names, old_names) [15:31:48.084] removed <- setdiff(old_names, names) [15:31:48.084] changed <- common[...future.oldEnvVars[common] != [15:31:48.084] envs[common]] [15:31:48.084] NAMES <- toupper(changed) [15:31:48.084] args <- list() [15:31:48.084] for (kk in seq_along(NAMES)) { [15:31:48.084] name <- changed[[kk]] [15:31:48.084] NAME <- NAMES[[kk]] [15:31:48.084] if (name != NAME && is.element(NAME, old_names)) [15:31:48.084] next [15:31:48.084] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.084] } [15:31:48.084] NAMES <- toupper(added) [15:31:48.084] for (kk in seq_along(NAMES)) { [15:31:48.084] name <- added[[kk]] [15:31:48.084] NAME <- NAMES[[kk]] [15:31:48.084] if (name != NAME && is.element(NAME, old_names)) [15:31:48.084] next [15:31:48.084] args[[name]] <- "" [15:31:48.084] } [15:31:48.084] NAMES <- toupper(removed) [15:31:48.084] for (kk in seq_along(NAMES)) { [15:31:48.084] name <- removed[[kk]] [15:31:48.084] NAME <- NAMES[[kk]] [15:31:48.084] if (name != NAME && is.element(NAME, old_names)) [15:31:48.084] next [15:31:48.084] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.084] } [15:31:48.084] if (length(args) > 0) [15:31:48.084] base::do.call(base::Sys.setenv, args = args) [15:31:48.084] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:48.084] } [15:31:48.084] else { [15:31:48.084] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:48.084] } [15:31:48.084] { [15:31:48.084] if (base::length(...future.futureOptionsAdded) > [15:31:48.084] 0L) { [15:31:48.084] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:48.084] base::names(opts) <- ...future.futureOptionsAdded [15:31:48.084] base::options(opts) [15:31:48.084] } [15:31:48.084] { [15:31:48.084] { [15:31:48.084] NULL [15:31:48.084] RNGkind("Mersenne-Twister") [15:31:48.084] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:48.084] inherits = FALSE) [15:31:48.084] } [15:31:48.084] options(future.plan = NULL) [15:31:48.084] if (is.na(NA_character_)) [15:31:48.084] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.084] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:48.084] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:48.084] .init = FALSE) [15:31:48.084] } [15:31:48.084] } [15:31:48.084] } [15:31:48.084] }) [15:31:48.084] if (TRUE) { [15:31:48.084] base::sink(type = "output", split = FALSE) [15:31:48.084] if (TRUE) { [15:31:48.084] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:48.084] } [15:31:48.084] else { [15:31:48.084] ...future.result["stdout"] <- base::list(NULL) [15:31:48.084] } [15:31:48.084] base::close(...future.stdout) [15:31:48.084] ...future.stdout <- NULL [15:31:48.084] } [15:31:48.084] ...future.result$conditions <- ...future.conditions [15:31:48.084] ...future.result$finished <- base::Sys.time() [15:31:48.084] ...future.result [15:31:48.084] } [15:31:48.091] assign_globals() ... [15:31:48.091] List of 5 [15:31:48.091] $ ...future.FUN :function (x) [15:31:48.091] $ future.call.arguments : list() [15:31:48.091] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:48.091] $ ...future.elements_ii :List of 2 [15:31:48.091] ..$ a: num 0 [15:31:48.091] ..$ b: num 0 [15:31:48.091] $ ...future.seeds_ii : NULL [15:31:48.091] $ ...future.globals.maxSize: NULL [15:31:48.091] - attr(*, "where")=List of 5 [15:31:48.091] ..$ ...future.FUN : [15:31:48.091] ..$ future.call.arguments : [15:31:48.091] ..$ ...future.elements_ii : [15:31:48.091] ..$ ...future.seeds_ii : [15:31:48.091] ..$ ...future.globals.maxSize: [15:31:48.091] - attr(*, "resolved")= logi FALSE [15:31:48.091] - attr(*, "total_size")= num 848 [15:31:48.091] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:48.091] - attr(*, "already-done")= logi TRUE [15:31:48.101] - copied '...future.FUN' to environment [15:31:48.102] - copied 'future.call.arguments' to environment [15:31:48.102] - copied '...future.elements_ii' to environment [15:31:48.102] - copied '...future.seeds_ii' to environment [15:31:48.102] - copied '...future.globals.maxSize' to environment [15:31:48.103] assign_globals() ... done [15:31:48.103] plan(): Setting new future strategy stack: [15:31:48.104] List of future strategies: [15:31:48.104] 1. sequential: [15:31:48.104] - args: function (..., envir = parent.frame(), workers = "") [15:31:48.104] - tweaked: FALSE [15:31:48.104] - call: NULL [15:31:48.105] plan(): nbrOfWorkers() = 1 [15:31:48.107] plan(): Setting new future strategy stack: [15:31:48.107] List of future strategies: [15:31:48.107] 1. sequential: [15:31:48.107] - args: function (..., envir = parent.frame(), workers = "") [15:31:48.107] - tweaked: FALSE [15:31:48.107] - call: plan(strategy) [15:31:48.108] plan(): nbrOfWorkers() = 1 [15:31:48.108] SequentialFuture started (and completed) [15:31:48.109] - Launch lazy future ... done [15:31:48.109] run() for 'SequentialFuture' ... done [15:31:48.109] Created future: [15:31:48.110] SequentialFuture: [15:31:48.110] Label: 'future_lapply-1' [15:31:48.110] Expression: [15:31:48.110] { [15:31:48.110] do.call(function(...) { [15:31:48.110] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.110] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.110] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.110] on.exit(options(oopts), add = TRUE) [15:31:48.110] } [15:31:48.110] { [15:31:48.110] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.110] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.110] ...future.FUN(...future.X_jj, ...) [15:31:48.110] }) [15:31:48.110] } [15:31:48.110] }, args = future.call.arguments) [15:31:48.110] } [15:31:48.110] Lazy evaluation: FALSE [15:31:48.110] Asynchronous evaluation: FALSE [15:31:48.110] Local evaluation: TRUE [15:31:48.110] Environment: R_GlobalEnv [15:31:48.110] Capture standard output: TRUE [15:31:48.110] Capture condition classes: 'condition' (excluding 'nothing') [15:31:48.110] Globals: 5 objects totaling 960 bytes (function '...future.FUN' of 848 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:48.110] Packages: [15:31:48.110] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:48.110] Resolved: TRUE [15:31:48.110] Value: 112 bytes of class 'list' [15:31:48.110] Early signaling: FALSE [15:31:48.110] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:48.110] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.112] Chunk #1 of 1 ... DONE [15:31:48.112] Launching 1 futures (chunks) ... DONE [15:31:48.112] Resolving 1 futures (chunks) ... [15:31:48.113] resolve() on list ... [15:31:48.113] recursive: 0 [15:31:48.113] length: 1 [15:31:48.113] [15:31:48.114] resolved() for 'SequentialFuture' ... [15:31:48.114] - state: 'finished' [15:31:48.114] - run: TRUE [15:31:48.114] - result: 'FutureResult' [15:31:48.115] resolved() for 'SequentialFuture' ... done [15:31:48.115] Future #1 [15:31:48.115] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:48.116] - nx: 1 [15:31:48.116] - relay: TRUE [15:31:48.116] - stdout: TRUE [15:31:48.116] - signal: TRUE [15:31:48.117] - resignal: FALSE [15:31:48.117] - force: TRUE [15:31:48.117] - relayed: [n=1] FALSE [15:31:48.117] - queued futures: [n=1] FALSE [15:31:48.118] - until=1 [15:31:48.118] - relaying element #1 [15:31:48.118] - relayed: [n=1] TRUE [15:31:48.119] - queued futures: [n=1] TRUE [15:31:48.119] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:48.119] length: 0 (resolved future 1) [15:31:48.119] Relaying remaining futures [15:31:48.120] signalConditionsASAP(NULL, pos=0) ... [15:31:48.120] - nx: 1 [15:31:48.120] - relay: TRUE [15:31:48.120] - stdout: TRUE [15:31:48.121] - signal: TRUE [15:31:48.121] - resignal: FALSE [15:31:48.121] - force: TRUE [15:31:48.121] - relayed: [n=1] TRUE [15:31:48.122] - queued futures: [n=1] TRUE - flush all [15:31:48.122] - relayed: [n=1] TRUE [15:31:48.122] - queued futures: [n=1] TRUE [15:31:48.123] signalConditionsASAP(NULL, pos=0) ... done [15:31:48.123] resolve() on list ... DONE [15:31:48.123] - Number of value chunks collected: 1 [15:31:48.123] Resolving 1 futures (chunks) ... DONE [15:31:48.124] Reducing values from 1 chunks ... [15:31:48.124] - Number of values collected after concatenation: 2 [15:31:48.124] - Number of values expected: 2 [15:31:48.124] Reducing values from 1 chunks ... DONE [15:31:48.125] future_lapply() ... DONE - plan('multisession') ... [15:31:48.125] plan(): Setting new future strategy stack: [15:31:48.126] List of future strategies: [15:31:48.126] 1. multisession: [15:31:48.126] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:48.126] - tweaked: FALSE [15:31:48.126] - call: plan(strategy) [15:31:48.127] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... [15:31:48.127] multisession: [15:31:48.127] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:48.127] - tweaked: FALSE [15:31:48.127] - call: plan(strategy) [15:31:48.131] getGlobalsAndPackages() ... [15:31:48.131] Not searching for globals [15:31:48.132] - globals: [0] [15:31:48.132] getGlobalsAndPackages() ... DONE [15:31:48.133] Packages needed by the future expression (n = 0): [15:31:48.133] Packages needed by future strategies (n = 0): [15:31:48.134] { [15:31:48.134] { [15:31:48.134] { [15:31:48.134] ...future.startTime <- base::Sys.time() [15:31:48.134] { [15:31:48.134] { [15:31:48.134] { [15:31:48.134] base::local({ [15:31:48.134] has_future <- base::requireNamespace("future", [15:31:48.134] quietly = TRUE) [15:31:48.134] if (has_future) { [15:31:48.134] ns <- base::getNamespace("future") [15:31:48.134] version <- ns[[".package"]][["version"]] [15:31:48.134] if (is.null(version)) [15:31:48.134] version <- utils::packageVersion("future") [15:31:48.134] } [15:31:48.134] else { [15:31:48.134] version <- NULL [15:31:48.134] } [15:31:48.134] if (!has_future || version < "1.8.0") { [15:31:48.134] info <- base::c(r_version = base::gsub("R version ", [15:31:48.134] "", base::R.version$version.string), [15:31:48.134] platform = base::sprintf("%s (%s-bit)", [15:31:48.134] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:48.134] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:48.134] "release", "version")], collapse = " "), [15:31:48.134] hostname = base::Sys.info()[["nodename"]]) [15:31:48.134] info <- base::sprintf("%s: %s", base::names(info), [15:31:48.134] info) [15:31:48.134] info <- base::paste(info, collapse = "; ") [15:31:48.134] if (!has_future) { [15:31:48.134] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:48.134] info) [15:31:48.134] } [15:31:48.134] else { [15:31:48.134] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:48.134] info, version) [15:31:48.134] } [15:31:48.134] base::stop(msg) [15:31:48.134] } [15:31:48.134] }) [15:31:48.134] } [15:31:48.134] ...future.strategy.old <- future::plan("list") [15:31:48.134] options(future.plan = NULL) [15:31:48.134] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.134] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:48.134] } [15:31:48.134] ...future.workdir <- getwd() [15:31:48.134] } [15:31:48.134] ...future.oldOptions <- base::as.list(base::.Options) [15:31:48.134] ...future.oldEnvVars <- base::Sys.getenv() [15:31:48.134] } [15:31:48.134] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:48.134] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:48.134] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:48.134] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:48.134] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:48.134] future.stdout.windows.reencode = NULL, width = 80L) [15:31:48.134] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:48.134] base::names(...future.oldOptions)) [15:31:48.134] } [15:31:48.134] if (FALSE) { [15:31:48.134] } [15:31:48.134] else { [15:31:48.134] if (TRUE) { [15:31:48.134] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:48.134] open = "w") [15:31:48.134] } [15:31:48.134] else { [15:31:48.134] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:48.134] windows = "NUL", "/dev/null"), open = "w") [15:31:48.134] } [15:31:48.134] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:48.134] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:48.134] base::sink(type = "output", split = FALSE) [15:31:48.134] base::close(...future.stdout) [15:31:48.134] }, add = TRUE) [15:31:48.134] } [15:31:48.134] ...future.frame <- base::sys.nframe() [15:31:48.134] ...future.conditions <- base::list() [15:31:48.134] ...future.rng <- base::globalenv()$.Random.seed [15:31:48.134] if (FALSE) { [15:31:48.134] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:48.134] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:48.134] } [15:31:48.134] ...future.result <- base::tryCatch({ [15:31:48.134] base::withCallingHandlers({ [15:31:48.134] ...future.value <- base::withVisible(base::local(NA)) [15:31:48.134] future::FutureResult(value = ...future.value$value, [15:31:48.134] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.134] ...future.rng), globalenv = if (FALSE) [15:31:48.134] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:48.134] ...future.globalenv.names)) [15:31:48.134] else NULL, started = ...future.startTime, version = "1.8") [15:31:48.134] }, condition = base::local({ [15:31:48.134] c <- base::c [15:31:48.134] inherits <- base::inherits [15:31:48.134] invokeRestart <- base::invokeRestart [15:31:48.134] length <- base::length [15:31:48.134] list <- base::list [15:31:48.134] seq.int <- base::seq.int [15:31:48.134] signalCondition <- base::signalCondition [15:31:48.134] sys.calls <- base::sys.calls [15:31:48.134] `[[` <- base::`[[` [15:31:48.134] `+` <- base::`+` [15:31:48.134] `<<-` <- base::`<<-` [15:31:48.134] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:48.134] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:48.134] 3L)] [15:31:48.134] } [15:31:48.134] function(cond) { [15:31:48.134] is_error <- inherits(cond, "error") [15:31:48.134] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:48.134] NULL) [15:31:48.134] if (is_error) { [15:31:48.134] sessionInformation <- function() { [15:31:48.134] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:48.134] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:48.134] search = base::search(), system = base::Sys.info()) [15:31:48.134] } [15:31:48.134] ...future.conditions[[length(...future.conditions) + [15:31:48.134] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:48.134] cond$call), session = sessionInformation(), [15:31:48.134] timestamp = base::Sys.time(), signaled = 0L) [15:31:48.134] signalCondition(cond) [15:31:48.134] } [15:31:48.134] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:48.134] "immediateCondition"))) { [15:31:48.134] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:48.134] ...future.conditions[[length(...future.conditions) + [15:31:48.134] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:48.134] if (TRUE && !signal) { [15:31:48.134] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.134] { [15:31:48.134] inherits <- base::inherits [15:31:48.134] invokeRestart <- base::invokeRestart [15:31:48.134] is.null <- base::is.null [15:31:48.134] muffled <- FALSE [15:31:48.134] if (inherits(cond, "message")) { [15:31:48.134] muffled <- grepl(pattern, "muffleMessage") [15:31:48.134] if (muffled) [15:31:48.134] invokeRestart("muffleMessage") [15:31:48.134] } [15:31:48.134] else if (inherits(cond, "warning")) { [15:31:48.134] muffled <- grepl(pattern, "muffleWarning") [15:31:48.134] if (muffled) [15:31:48.134] invokeRestart("muffleWarning") [15:31:48.134] } [15:31:48.134] else if (inherits(cond, "condition")) { [15:31:48.134] if (!is.null(pattern)) { [15:31:48.134] computeRestarts <- base::computeRestarts [15:31:48.134] grepl <- base::grepl [15:31:48.134] restarts <- computeRestarts(cond) [15:31:48.134] for (restart in restarts) { [15:31:48.134] name <- restart$name [15:31:48.134] if (is.null(name)) [15:31:48.134] next [15:31:48.134] if (!grepl(pattern, name)) [15:31:48.134] next [15:31:48.134] invokeRestart(restart) [15:31:48.134] muffled <- TRUE [15:31:48.134] break [15:31:48.134] } [15:31:48.134] } [15:31:48.134] } [15:31:48.134] invisible(muffled) [15:31:48.134] } [15:31:48.134] muffleCondition(cond, pattern = "^muffle") [15:31:48.134] } [15:31:48.134] } [15:31:48.134] else { [15:31:48.134] if (TRUE) { [15:31:48.134] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.134] { [15:31:48.134] inherits <- base::inherits [15:31:48.134] invokeRestart <- base::invokeRestart [15:31:48.134] is.null <- base::is.null [15:31:48.134] muffled <- FALSE [15:31:48.134] if (inherits(cond, "message")) { [15:31:48.134] muffled <- grepl(pattern, "muffleMessage") [15:31:48.134] if (muffled) [15:31:48.134] invokeRestart("muffleMessage") [15:31:48.134] } [15:31:48.134] else if (inherits(cond, "warning")) { [15:31:48.134] muffled <- grepl(pattern, "muffleWarning") [15:31:48.134] if (muffled) [15:31:48.134] invokeRestart("muffleWarning") [15:31:48.134] } [15:31:48.134] else if (inherits(cond, "condition")) { [15:31:48.134] if (!is.null(pattern)) { [15:31:48.134] computeRestarts <- base::computeRestarts [15:31:48.134] grepl <- base::grepl [15:31:48.134] restarts <- computeRestarts(cond) [15:31:48.134] for (restart in restarts) { [15:31:48.134] name <- restart$name [15:31:48.134] if (is.null(name)) [15:31:48.134] next [15:31:48.134] if (!grepl(pattern, name)) [15:31:48.134] next [15:31:48.134] invokeRestart(restart) [15:31:48.134] muffled <- TRUE [15:31:48.134] break [15:31:48.134] } [15:31:48.134] } [15:31:48.134] } [15:31:48.134] invisible(muffled) [15:31:48.134] } [15:31:48.134] muffleCondition(cond, pattern = "^muffle") [15:31:48.134] } [15:31:48.134] } [15:31:48.134] } [15:31:48.134] })) [15:31:48.134] }, error = function(ex) { [15:31:48.134] base::structure(base::list(value = NULL, visible = NULL, [15:31:48.134] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.134] ...future.rng), started = ...future.startTime, [15:31:48.134] finished = Sys.time(), session_uuid = NA_character_, [15:31:48.134] version = "1.8"), class = "FutureResult") [15:31:48.134] }, finally = { [15:31:48.134] if (!identical(...future.workdir, getwd())) [15:31:48.134] setwd(...future.workdir) [15:31:48.134] { [15:31:48.134] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:48.134] ...future.oldOptions$nwarnings <- NULL [15:31:48.134] } [15:31:48.134] base::options(...future.oldOptions) [15:31:48.134] if (.Platform$OS.type == "windows") { [15:31:48.134] old_names <- names(...future.oldEnvVars) [15:31:48.134] envs <- base::Sys.getenv() [15:31:48.134] names <- names(envs) [15:31:48.134] common <- intersect(names, old_names) [15:31:48.134] added <- setdiff(names, old_names) [15:31:48.134] removed <- setdiff(old_names, names) [15:31:48.134] changed <- common[...future.oldEnvVars[common] != [15:31:48.134] envs[common]] [15:31:48.134] NAMES <- toupper(changed) [15:31:48.134] args <- list() [15:31:48.134] for (kk in seq_along(NAMES)) { [15:31:48.134] name <- changed[[kk]] [15:31:48.134] NAME <- NAMES[[kk]] [15:31:48.134] if (name != NAME && is.element(NAME, old_names)) [15:31:48.134] next [15:31:48.134] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.134] } [15:31:48.134] NAMES <- toupper(added) [15:31:48.134] for (kk in seq_along(NAMES)) { [15:31:48.134] name <- added[[kk]] [15:31:48.134] NAME <- NAMES[[kk]] [15:31:48.134] if (name != NAME && is.element(NAME, old_names)) [15:31:48.134] next [15:31:48.134] args[[name]] <- "" [15:31:48.134] } [15:31:48.134] NAMES <- toupper(removed) [15:31:48.134] for (kk in seq_along(NAMES)) { [15:31:48.134] name <- removed[[kk]] [15:31:48.134] NAME <- NAMES[[kk]] [15:31:48.134] if (name != NAME && is.element(NAME, old_names)) [15:31:48.134] next [15:31:48.134] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.134] } [15:31:48.134] if (length(args) > 0) [15:31:48.134] base::do.call(base::Sys.setenv, args = args) [15:31:48.134] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:48.134] } [15:31:48.134] else { [15:31:48.134] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:48.134] } [15:31:48.134] { [15:31:48.134] if (base::length(...future.futureOptionsAdded) > [15:31:48.134] 0L) { [15:31:48.134] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:48.134] base::names(opts) <- ...future.futureOptionsAdded [15:31:48.134] base::options(opts) [15:31:48.134] } [15:31:48.134] { [15:31:48.134] { [15:31:48.134] NULL [15:31:48.134] RNGkind("Mersenne-Twister") [15:31:48.134] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:48.134] inherits = FALSE) [15:31:48.134] } [15:31:48.134] options(future.plan = NULL) [15:31:48.134] if (is.na(NA_character_)) [15:31:48.134] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.134] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:48.134] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:48.134] .init = FALSE) [15:31:48.134] } [15:31:48.134] } [15:31:48.134] } [15:31:48.134] }) [15:31:48.134] if (TRUE) { [15:31:48.134] base::sink(type = "output", split = FALSE) [15:31:48.134] if (TRUE) { [15:31:48.134] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:48.134] } [15:31:48.134] else { [15:31:48.134] ...future.result["stdout"] <- base::list(NULL) [15:31:48.134] } [15:31:48.134] base::close(...future.stdout) [15:31:48.134] ...future.stdout <- NULL [15:31:48.134] } [15:31:48.134] ...future.result$conditions <- ...future.conditions [15:31:48.134] ...future.result$finished <- base::Sys.time() [15:31:48.134] ...future.result [15:31:48.134] } [15:31:48.140] plan(): Setting new future strategy stack: [15:31:48.140] List of future strategies: [15:31:48.140] 1. sequential: [15:31:48.140] - args: function (..., envir = parent.frame(), workers = "") [15:31:48.140] - tweaked: FALSE [15:31:48.140] - call: NULL [15:31:48.141] plan(): nbrOfWorkers() = 1 [15:31:48.143] plan(): Setting new future strategy stack: [15:31:48.143] List of future strategies: [15:31:48.143] 1. multisession: [15:31:48.143] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:48.143] - tweaked: FALSE [15:31:48.143] - call: plan(strategy) [15:31:48.146] plan(): nbrOfWorkers() = 1 [15:31:48.146] SequentialFuture started (and completed) [15:31:48.146] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... DONE [15:31:48.148] plan(): nbrOfWorkers() = 1 - future_lapply(x, FUN = vector, ...) ... [15:31:48.149] future_lapply() ... [15:31:48.152] Number of chunks: 4 [15:31:48.152] getGlobalsAndPackagesXApply() ... [15:31:48.152] - future.globals: TRUE [15:31:48.152] getGlobalsAndPackages() ... [15:31:48.153] Searching for globals... [15:31:48.154] - globals found: [2] 'FUN', '.Internal' [15:31:48.154] Searching for globals ... DONE [15:31:48.154] Resolving globals: FALSE [15:31:48.155] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:48.156] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:48.156] - globals: [1] 'FUN' [15:31:48.156] [15:31:48.157] getGlobalsAndPackages() ... DONE [15:31:48.157] - globals found/used: [n=1] 'FUN' [15:31:48.157] - needed namespaces: [n=0] [15:31:48.157] Finding globals ... DONE [15:31:48.157] - use_args: TRUE [15:31:48.157] - Getting '...' globals ... [15:31:48.158] resolve() on list ... [15:31:48.158] recursive: 0 [15:31:48.158] length: 1 [15:31:48.158] elements: '...' [15:31:48.159] length: 0 (resolved future 1) [15:31:48.159] resolve() on list ... DONE [15:31:48.159] - '...' content: [n=1] 'length' [15:31:48.159] List of 1 [15:31:48.159] $ ...:List of 1 [15:31:48.159] ..$ length: int 2 [15:31:48.159] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:48.159] - attr(*, "where")=List of 1 [15:31:48.159] ..$ ...: [15:31:48.159] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:48.159] - attr(*, "resolved")= logi TRUE [15:31:48.159] - attr(*, "total_size")= num NA [15:31:48.164] - Getting '...' globals ... DONE [15:31:48.164] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:48.164] List of 2 [15:31:48.164] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:48.164] $ ... :List of 1 [15:31:48.164] ..$ length: int 2 [15:31:48.164] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:48.164] - attr(*, "where")=List of 2 [15:31:48.164] ..$ ...future.FUN: [15:31:48.164] ..$ ... : [15:31:48.164] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:48.164] - attr(*, "resolved")= logi FALSE [15:31:48.164] - attr(*, "total_size")= num 2240 [15:31:48.170] Packages to be attached in all futures: [n=0] [15:31:48.171] getGlobalsAndPackagesXApply() ... DONE [15:31:48.171] Number of futures (= number of chunks): 4 [15:31:48.171] Launching 4 futures (chunks) ... [15:31:48.172] Chunk #1 of 4 ... [15:31:48.172] - Finding globals in 'X' for chunk #1 ... [15:31:48.172] getGlobalsAndPackages() ... [15:31:48.173] Searching for globals... [15:31:48.173] [15:31:48.173] Searching for globals ... DONE [15:31:48.174] - globals: [0] [15:31:48.174] getGlobalsAndPackages() ... DONE [15:31:48.174] + additional globals found: [n=0] [15:31:48.175] + additional namespaces needed: [n=0] [15:31:48.175] - Finding globals in 'X' for chunk #1 ... DONE [15:31:48.175] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:48.175] - seeds: [15:31:48.176] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.176] getGlobalsAndPackages() ... [15:31:48.176] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.176] Resolving globals: FALSE [15:31:48.176] Tweak future expression to call with '...' arguments ... [15:31:48.177] { [15:31:48.177] do.call(function(...) { [15:31:48.177] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.177] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.177] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.177] on.exit(options(oopts), add = TRUE) [15:31:48.177] } [15:31:48.177] { [15:31:48.177] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.177] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.177] ...future.FUN(...future.X_jj, ...) [15:31:48.177] }) [15:31:48.177] } [15:31:48.177] }, args = future.call.arguments) [15:31:48.177] } [15:31:48.177] Tweak future expression to call with '...' arguments ... DONE [15:31:48.178] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.178] [15:31:48.178] getGlobalsAndPackages() ... DONE [15:31:48.179] run() for 'Future' ... [15:31:48.179] - state: 'created' [15:31:48.179] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:48.184] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.184] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:48.184] - Field: 'label' [15:31:48.185] - Field: 'local' [15:31:48.185] - Field: 'owner' [15:31:48.185] - Field: 'envir' [15:31:48.186] - Field: 'packages' [15:31:48.186] - Field: 'gc' [15:31:48.186] - Field: 'conditions' [15:31:48.187] - Field: 'expr' [15:31:48.187] - Field: 'uuid' [15:31:48.187] - Field: 'seed' [15:31:48.188] - Field: 'version' [15:31:48.188] - Field: 'result' [15:31:48.188] - Field: 'asynchronous' [15:31:48.189] - Field: 'calls' [15:31:48.189] - Field: 'globals' [15:31:48.189] - Field: 'stdout' [15:31:48.190] - Field: 'earlySignal' [15:31:48.190] - Field: 'lazy' [15:31:48.190] - Field: 'state' [15:31:48.191] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:48.191] - Launch lazy future ... [15:31:48.191] Packages needed by the future expression (n = 0): [15:31:48.192] Packages needed by future strategies (n = 0): [15:31:48.192] { [15:31:48.192] { [15:31:48.192] { [15:31:48.192] ...future.startTime <- base::Sys.time() [15:31:48.192] { [15:31:48.192] { [15:31:48.192] { [15:31:48.192] base::local({ [15:31:48.192] has_future <- base::requireNamespace("future", [15:31:48.192] quietly = TRUE) [15:31:48.192] if (has_future) { [15:31:48.192] ns <- base::getNamespace("future") [15:31:48.192] version <- ns[[".package"]][["version"]] [15:31:48.192] if (is.null(version)) [15:31:48.192] version <- utils::packageVersion("future") [15:31:48.192] } [15:31:48.192] else { [15:31:48.192] version <- NULL [15:31:48.192] } [15:31:48.192] if (!has_future || version < "1.8.0") { [15:31:48.192] info <- base::c(r_version = base::gsub("R version ", [15:31:48.192] "", base::R.version$version.string), [15:31:48.192] platform = base::sprintf("%s (%s-bit)", [15:31:48.192] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:48.192] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:48.192] "release", "version")], collapse = " "), [15:31:48.192] hostname = base::Sys.info()[["nodename"]]) [15:31:48.192] info <- base::sprintf("%s: %s", base::names(info), [15:31:48.192] info) [15:31:48.192] info <- base::paste(info, collapse = "; ") [15:31:48.192] if (!has_future) { [15:31:48.192] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:48.192] info) [15:31:48.192] } [15:31:48.192] else { [15:31:48.192] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:48.192] info, version) [15:31:48.192] } [15:31:48.192] base::stop(msg) [15:31:48.192] } [15:31:48.192] }) [15:31:48.192] } [15:31:48.192] ...future.strategy.old <- future::plan("list") [15:31:48.192] options(future.plan = NULL) [15:31:48.192] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.192] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:48.192] } [15:31:48.192] ...future.workdir <- getwd() [15:31:48.192] } [15:31:48.192] ...future.oldOptions <- base::as.list(base::.Options) [15:31:48.192] ...future.oldEnvVars <- base::Sys.getenv() [15:31:48.192] } [15:31:48.192] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:48.192] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:48.192] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:48.192] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:48.192] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:48.192] future.stdout.windows.reencode = NULL, width = 80L) [15:31:48.192] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:48.192] base::names(...future.oldOptions)) [15:31:48.192] } [15:31:48.192] if (FALSE) { [15:31:48.192] } [15:31:48.192] else { [15:31:48.192] if (TRUE) { [15:31:48.192] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:48.192] open = "w") [15:31:48.192] } [15:31:48.192] else { [15:31:48.192] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:48.192] windows = "NUL", "/dev/null"), open = "w") [15:31:48.192] } [15:31:48.192] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:48.192] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:48.192] base::sink(type = "output", split = FALSE) [15:31:48.192] base::close(...future.stdout) [15:31:48.192] }, add = TRUE) [15:31:48.192] } [15:31:48.192] ...future.frame <- base::sys.nframe() [15:31:48.192] ...future.conditions <- base::list() [15:31:48.192] ...future.rng <- base::globalenv()$.Random.seed [15:31:48.192] if (FALSE) { [15:31:48.192] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:48.192] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:48.192] } [15:31:48.192] ...future.result <- base::tryCatch({ [15:31:48.192] base::withCallingHandlers({ [15:31:48.192] ...future.value <- base::withVisible(base::local({ [15:31:48.192] do.call(function(...) { [15:31:48.192] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.192] if (!identical(...future.globals.maxSize.org, [15:31:48.192] ...future.globals.maxSize)) { [15:31:48.192] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.192] on.exit(options(oopts), add = TRUE) [15:31:48.192] } [15:31:48.192] { [15:31:48.192] lapply(seq_along(...future.elements_ii), [15:31:48.192] FUN = function(jj) { [15:31:48.192] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.192] ...future.FUN(...future.X_jj, ...) [15:31:48.192] }) [15:31:48.192] } [15:31:48.192] }, args = future.call.arguments) [15:31:48.192] })) [15:31:48.192] future::FutureResult(value = ...future.value$value, [15:31:48.192] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.192] ...future.rng), globalenv = if (FALSE) [15:31:48.192] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:48.192] ...future.globalenv.names)) [15:31:48.192] else NULL, started = ...future.startTime, version = "1.8") [15:31:48.192] }, condition = base::local({ [15:31:48.192] c <- base::c [15:31:48.192] inherits <- base::inherits [15:31:48.192] invokeRestart <- base::invokeRestart [15:31:48.192] length <- base::length [15:31:48.192] list <- base::list [15:31:48.192] seq.int <- base::seq.int [15:31:48.192] signalCondition <- base::signalCondition [15:31:48.192] sys.calls <- base::sys.calls [15:31:48.192] `[[` <- base::`[[` [15:31:48.192] `+` <- base::`+` [15:31:48.192] `<<-` <- base::`<<-` [15:31:48.192] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:48.192] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:48.192] 3L)] [15:31:48.192] } [15:31:48.192] function(cond) { [15:31:48.192] is_error <- inherits(cond, "error") [15:31:48.192] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:48.192] NULL) [15:31:48.192] if (is_error) { [15:31:48.192] sessionInformation <- function() { [15:31:48.192] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:48.192] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:48.192] search = base::search(), system = base::Sys.info()) [15:31:48.192] } [15:31:48.192] ...future.conditions[[length(...future.conditions) + [15:31:48.192] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:48.192] cond$call), session = sessionInformation(), [15:31:48.192] timestamp = base::Sys.time(), signaled = 0L) [15:31:48.192] signalCondition(cond) [15:31:48.192] } [15:31:48.192] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:48.192] "immediateCondition"))) { [15:31:48.192] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:48.192] ...future.conditions[[length(...future.conditions) + [15:31:48.192] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:48.192] if (TRUE && !signal) { [15:31:48.192] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.192] { [15:31:48.192] inherits <- base::inherits [15:31:48.192] invokeRestart <- base::invokeRestart [15:31:48.192] is.null <- base::is.null [15:31:48.192] muffled <- FALSE [15:31:48.192] if (inherits(cond, "message")) { [15:31:48.192] muffled <- grepl(pattern, "muffleMessage") [15:31:48.192] if (muffled) [15:31:48.192] invokeRestart("muffleMessage") [15:31:48.192] } [15:31:48.192] else if (inherits(cond, "warning")) { [15:31:48.192] muffled <- grepl(pattern, "muffleWarning") [15:31:48.192] if (muffled) [15:31:48.192] invokeRestart("muffleWarning") [15:31:48.192] } [15:31:48.192] else if (inherits(cond, "condition")) { [15:31:48.192] if (!is.null(pattern)) { [15:31:48.192] computeRestarts <- base::computeRestarts [15:31:48.192] grepl <- base::grepl [15:31:48.192] restarts <- computeRestarts(cond) [15:31:48.192] for (restart in restarts) { [15:31:48.192] name <- restart$name [15:31:48.192] if (is.null(name)) [15:31:48.192] next [15:31:48.192] if (!grepl(pattern, name)) [15:31:48.192] next [15:31:48.192] invokeRestart(restart) [15:31:48.192] muffled <- TRUE [15:31:48.192] break [15:31:48.192] } [15:31:48.192] } [15:31:48.192] } [15:31:48.192] invisible(muffled) [15:31:48.192] } [15:31:48.192] muffleCondition(cond, pattern = "^muffle") [15:31:48.192] } [15:31:48.192] } [15:31:48.192] else { [15:31:48.192] if (TRUE) { [15:31:48.192] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.192] { [15:31:48.192] inherits <- base::inherits [15:31:48.192] invokeRestart <- base::invokeRestart [15:31:48.192] is.null <- base::is.null [15:31:48.192] muffled <- FALSE [15:31:48.192] if (inherits(cond, "message")) { [15:31:48.192] muffled <- grepl(pattern, "muffleMessage") [15:31:48.192] if (muffled) [15:31:48.192] invokeRestart("muffleMessage") [15:31:48.192] } [15:31:48.192] else if (inherits(cond, "warning")) { [15:31:48.192] muffled <- grepl(pattern, "muffleWarning") [15:31:48.192] if (muffled) [15:31:48.192] invokeRestart("muffleWarning") [15:31:48.192] } [15:31:48.192] else if (inherits(cond, "condition")) { [15:31:48.192] if (!is.null(pattern)) { [15:31:48.192] computeRestarts <- base::computeRestarts [15:31:48.192] grepl <- base::grepl [15:31:48.192] restarts <- computeRestarts(cond) [15:31:48.192] for (restart in restarts) { [15:31:48.192] name <- restart$name [15:31:48.192] if (is.null(name)) [15:31:48.192] next [15:31:48.192] if (!grepl(pattern, name)) [15:31:48.192] next [15:31:48.192] invokeRestart(restart) [15:31:48.192] muffled <- TRUE [15:31:48.192] break [15:31:48.192] } [15:31:48.192] } [15:31:48.192] } [15:31:48.192] invisible(muffled) [15:31:48.192] } [15:31:48.192] muffleCondition(cond, pattern = "^muffle") [15:31:48.192] } [15:31:48.192] } [15:31:48.192] } [15:31:48.192] })) [15:31:48.192] }, error = function(ex) { [15:31:48.192] base::structure(base::list(value = NULL, visible = NULL, [15:31:48.192] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.192] ...future.rng), started = ...future.startTime, [15:31:48.192] finished = Sys.time(), session_uuid = NA_character_, [15:31:48.192] version = "1.8"), class = "FutureResult") [15:31:48.192] }, finally = { [15:31:48.192] if (!identical(...future.workdir, getwd())) [15:31:48.192] setwd(...future.workdir) [15:31:48.192] { [15:31:48.192] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:48.192] ...future.oldOptions$nwarnings <- NULL [15:31:48.192] } [15:31:48.192] base::options(...future.oldOptions) [15:31:48.192] if (.Platform$OS.type == "windows") { [15:31:48.192] old_names <- names(...future.oldEnvVars) [15:31:48.192] envs <- base::Sys.getenv() [15:31:48.192] names <- names(envs) [15:31:48.192] common <- intersect(names, old_names) [15:31:48.192] added <- setdiff(names, old_names) [15:31:48.192] removed <- setdiff(old_names, names) [15:31:48.192] changed <- common[...future.oldEnvVars[common] != [15:31:48.192] envs[common]] [15:31:48.192] NAMES <- toupper(changed) [15:31:48.192] args <- list() [15:31:48.192] for (kk in seq_along(NAMES)) { [15:31:48.192] name <- changed[[kk]] [15:31:48.192] NAME <- NAMES[[kk]] [15:31:48.192] if (name != NAME && is.element(NAME, old_names)) [15:31:48.192] next [15:31:48.192] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.192] } [15:31:48.192] NAMES <- toupper(added) [15:31:48.192] for (kk in seq_along(NAMES)) { [15:31:48.192] name <- added[[kk]] [15:31:48.192] NAME <- NAMES[[kk]] [15:31:48.192] if (name != NAME && is.element(NAME, old_names)) [15:31:48.192] next [15:31:48.192] args[[name]] <- "" [15:31:48.192] } [15:31:48.192] NAMES <- toupper(removed) [15:31:48.192] for (kk in seq_along(NAMES)) { [15:31:48.192] name <- removed[[kk]] [15:31:48.192] NAME <- NAMES[[kk]] [15:31:48.192] if (name != NAME && is.element(NAME, old_names)) [15:31:48.192] next [15:31:48.192] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.192] } [15:31:48.192] if (length(args) > 0) [15:31:48.192] base::do.call(base::Sys.setenv, args = args) [15:31:48.192] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:48.192] } [15:31:48.192] else { [15:31:48.192] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:48.192] } [15:31:48.192] { [15:31:48.192] if (base::length(...future.futureOptionsAdded) > [15:31:48.192] 0L) { [15:31:48.192] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:48.192] base::names(opts) <- ...future.futureOptionsAdded [15:31:48.192] base::options(opts) [15:31:48.192] } [15:31:48.192] { [15:31:48.192] { [15:31:48.192] NULL [15:31:48.192] RNGkind("Mersenne-Twister") [15:31:48.192] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:48.192] inherits = FALSE) [15:31:48.192] } [15:31:48.192] options(future.plan = NULL) [15:31:48.192] if (is.na(NA_character_)) [15:31:48.192] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.192] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:48.192] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:48.192] .init = FALSE) [15:31:48.192] } [15:31:48.192] } [15:31:48.192] } [15:31:48.192] }) [15:31:48.192] if (TRUE) { [15:31:48.192] base::sink(type = "output", split = FALSE) [15:31:48.192] if (TRUE) { [15:31:48.192] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:48.192] } [15:31:48.192] else { [15:31:48.192] ...future.result["stdout"] <- base::list(NULL) [15:31:48.192] } [15:31:48.192] base::close(...future.stdout) [15:31:48.192] ...future.stdout <- NULL [15:31:48.192] } [15:31:48.192] ...future.result$conditions <- ...future.conditions [15:31:48.192] ...future.result$finished <- base::Sys.time() [15:31:48.192] ...future.result [15:31:48.192] } [15:31:48.199] assign_globals() ... [15:31:48.200] List of 5 [15:31:48.200] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:48.200] $ future.call.arguments :List of 1 [15:31:48.200] ..$ length: int 2 [15:31:48.200] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:48.200] $ ...future.elements_ii :List of 1 [15:31:48.200] ..$ a: chr "integer" [15:31:48.200] $ ...future.seeds_ii : NULL [15:31:48.200] $ ...future.globals.maxSize: NULL [15:31:48.200] - attr(*, "where")=List of 5 [15:31:48.200] ..$ ...future.FUN : [15:31:48.200] ..$ future.call.arguments : [15:31:48.200] ..$ ...future.elements_ii : [15:31:48.200] ..$ ...future.seeds_ii : [15:31:48.200] ..$ ...future.globals.maxSize: [15:31:48.200] - attr(*, "resolved")= logi FALSE [15:31:48.200] - attr(*, "total_size")= num 2240 [15:31:48.200] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:48.200] - attr(*, "already-done")= logi TRUE [15:31:48.213] - copied '...future.FUN' to environment [15:31:48.213] - copied 'future.call.arguments' to environment [15:31:48.213] - copied '...future.elements_ii' to environment [15:31:48.214] - copied '...future.seeds_ii' to environment [15:31:48.214] - copied '...future.globals.maxSize' to environment [15:31:48.214] assign_globals() ... done [15:31:48.215] plan(): Setting new future strategy stack: [15:31:48.215] List of future strategies: [15:31:48.215] 1. sequential: [15:31:48.215] - args: function (..., envir = parent.frame(), workers = "") [15:31:48.215] - tweaked: FALSE [15:31:48.215] - call: NULL [15:31:48.216] plan(): nbrOfWorkers() = 1 [15:31:48.218] plan(): Setting new future strategy stack: [15:31:48.218] List of future strategies: [15:31:48.218] 1. multisession: [15:31:48.218] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:48.218] - tweaked: FALSE [15:31:48.218] - call: plan(strategy) [15:31:48.222] plan(): nbrOfWorkers() = 1 [15:31:48.223] SequentialFuture started (and completed) [15:31:48.223] - Launch lazy future ... done [15:31:48.223] run() for 'SequentialFuture' ... done [15:31:48.224] Created future: [15:31:48.224] SequentialFuture: [15:31:48.224] Label: 'future_lapply-1' [15:31:48.224] Expression: [15:31:48.224] { [15:31:48.224] do.call(function(...) { [15:31:48.224] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.224] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.224] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.224] on.exit(options(oopts), add = TRUE) [15:31:48.224] } [15:31:48.224] { [15:31:48.224] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.224] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.224] ...future.FUN(...future.X_jj, ...) [15:31:48.224] }) [15:31:48.224] } [15:31:48.224] }, args = future.call.arguments) [15:31:48.224] } [15:31:48.224] Lazy evaluation: FALSE [15:31:48.224] Asynchronous evaluation: FALSE [15:31:48.224] Local evaluation: TRUE [15:31:48.224] Environment: R_GlobalEnv [15:31:48.224] Capture standard output: TRUE [15:31:48.224] Capture condition classes: 'condition' (excluding 'nothing') [15:31:48.224] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:48.224] Packages: [15:31:48.224] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:48.224] Resolved: TRUE [15:31:48.224] Value: 56 bytes of class 'list' [15:31:48.224] Early signaling: FALSE [15:31:48.224] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:48.224] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.226] Chunk #1 of 4 ... DONE [15:31:48.226] Chunk #2 of 4 ... [15:31:48.227] - Finding globals in 'X' for chunk #2 ... [15:31:48.227] getGlobalsAndPackages() ... [15:31:48.227] Searching for globals... [15:31:48.228] [15:31:48.228] Searching for globals ... DONE [15:31:48.228] - globals: [0] [15:31:48.229] getGlobalsAndPackages() ... DONE [15:31:48.229] + additional globals found: [n=0] [15:31:48.229] + additional namespaces needed: [n=0] [15:31:48.229] - Finding globals in 'X' for chunk #2 ... DONE [15:31:48.230] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:48.230] - seeds: [15:31:48.230] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.230] getGlobalsAndPackages() ... [15:31:48.231] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.231] Resolving globals: FALSE [15:31:48.231] Tweak future expression to call with '...' arguments ... [15:31:48.232] { [15:31:48.232] do.call(function(...) { [15:31:48.232] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.232] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.232] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.232] on.exit(options(oopts), add = TRUE) [15:31:48.232] } [15:31:48.232] { [15:31:48.232] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.232] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.232] ...future.FUN(...future.X_jj, ...) [15:31:48.232] }) [15:31:48.232] } [15:31:48.232] }, args = future.call.arguments) [15:31:48.232] } [15:31:48.232] Tweak future expression to call with '...' arguments ... DONE [15:31:48.233] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.234] [15:31:48.234] getGlobalsAndPackages() ... DONE [15:31:48.234] run() for 'Future' ... [15:31:48.235] - state: 'created' [15:31:48.235] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:48.239] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.240] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:48.240] - Field: 'label' [15:31:48.240] - Field: 'local' [15:31:48.240] - Field: 'owner' [15:31:48.241] - Field: 'envir' [15:31:48.241] - Field: 'packages' [15:31:48.241] - Field: 'gc' [15:31:48.242] - Field: 'conditions' [15:31:48.242] - Field: 'expr' [15:31:48.242] - Field: 'uuid' [15:31:48.243] - Field: 'seed' [15:31:48.243] - Field: 'version' [15:31:48.243] - Field: 'result' [15:31:48.243] - Field: 'asynchronous' [15:31:48.244] - Field: 'calls' [15:31:48.244] - Field: 'globals' [15:31:48.244] - Field: 'stdout' [15:31:48.245] - Field: 'earlySignal' [15:31:48.245] - Field: 'lazy' [15:31:48.245] - Field: 'state' [15:31:48.246] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:48.246] - Launch lazy future ... [15:31:48.246] Packages needed by the future expression (n = 0): [15:31:48.247] Packages needed by future strategies (n = 0): [15:31:48.248] { [15:31:48.248] { [15:31:48.248] { [15:31:48.248] ...future.startTime <- base::Sys.time() [15:31:48.248] { [15:31:48.248] { [15:31:48.248] { [15:31:48.248] base::local({ [15:31:48.248] has_future <- base::requireNamespace("future", [15:31:48.248] quietly = TRUE) [15:31:48.248] if (has_future) { [15:31:48.248] ns <- base::getNamespace("future") [15:31:48.248] version <- ns[[".package"]][["version"]] [15:31:48.248] if (is.null(version)) [15:31:48.248] version <- utils::packageVersion("future") [15:31:48.248] } [15:31:48.248] else { [15:31:48.248] version <- NULL [15:31:48.248] } [15:31:48.248] if (!has_future || version < "1.8.0") { [15:31:48.248] info <- base::c(r_version = base::gsub("R version ", [15:31:48.248] "", base::R.version$version.string), [15:31:48.248] platform = base::sprintf("%s (%s-bit)", [15:31:48.248] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:48.248] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:48.248] "release", "version")], collapse = " "), [15:31:48.248] hostname = base::Sys.info()[["nodename"]]) [15:31:48.248] info <- base::sprintf("%s: %s", base::names(info), [15:31:48.248] info) [15:31:48.248] info <- base::paste(info, collapse = "; ") [15:31:48.248] if (!has_future) { [15:31:48.248] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:48.248] info) [15:31:48.248] } [15:31:48.248] else { [15:31:48.248] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:48.248] info, version) [15:31:48.248] } [15:31:48.248] base::stop(msg) [15:31:48.248] } [15:31:48.248] }) [15:31:48.248] } [15:31:48.248] ...future.strategy.old <- future::plan("list") [15:31:48.248] options(future.plan = NULL) [15:31:48.248] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.248] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:48.248] } [15:31:48.248] ...future.workdir <- getwd() [15:31:48.248] } [15:31:48.248] ...future.oldOptions <- base::as.list(base::.Options) [15:31:48.248] ...future.oldEnvVars <- base::Sys.getenv() [15:31:48.248] } [15:31:48.248] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:48.248] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:48.248] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:48.248] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:48.248] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:48.248] future.stdout.windows.reencode = NULL, width = 80L) [15:31:48.248] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:48.248] base::names(...future.oldOptions)) [15:31:48.248] } [15:31:48.248] if (FALSE) { [15:31:48.248] } [15:31:48.248] else { [15:31:48.248] if (TRUE) { [15:31:48.248] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:48.248] open = "w") [15:31:48.248] } [15:31:48.248] else { [15:31:48.248] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:48.248] windows = "NUL", "/dev/null"), open = "w") [15:31:48.248] } [15:31:48.248] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:48.248] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:48.248] base::sink(type = "output", split = FALSE) [15:31:48.248] base::close(...future.stdout) [15:31:48.248] }, add = TRUE) [15:31:48.248] } [15:31:48.248] ...future.frame <- base::sys.nframe() [15:31:48.248] ...future.conditions <- base::list() [15:31:48.248] ...future.rng <- base::globalenv()$.Random.seed [15:31:48.248] if (FALSE) { [15:31:48.248] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:48.248] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:48.248] } [15:31:48.248] ...future.result <- base::tryCatch({ [15:31:48.248] base::withCallingHandlers({ [15:31:48.248] ...future.value <- base::withVisible(base::local({ [15:31:48.248] do.call(function(...) { [15:31:48.248] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.248] if (!identical(...future.globals.maxSize.org, [15:31:48.248] ...future.globals.maxSize)) { [15:31:48.248] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.248] on.exit(options(oopts), add = TRUE) [15:31:48.248] } [15:31:48.248] { [15:31:48.248] lapply(seq_along(...future.elements_ii), [15:31:48.248] FUN = function(jj) { [15:31:48.248] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.248] ...future.FUN(...future.X_jj, ...) [15:31:48.248] }) [15:31:48.248] } [15:31:48.248] }, args = future.call.arguments) [15:31:48.248] })) [15:31:48.248] future::FutureResult(value = ...future.value$value, [15:31:48.248] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.248] ...future.rng), globalenv = if (FALSE) [15:31:48.248] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:48.248] ...future.globalenv.names)) [15:31:48.248] else NULL, started = ...future.startTime, version = "1.8") [15:31:48.248] }, condition = base::local({ [15:31:48.248] c <- base::c [15:31:48.248] inherits <- base::inherits [15:31:48.248] invokeRestart <- base::invokeRestart [15:31:48.248] length <- base::length [15:31:48.248] list <- base::list [15:31:48.248] seq.int <- base::seq.int [15:31:48.248] signalCondition <- base::signalCondition [15:31:48.248] sys.calls <- base::sys.calls [15:31:48.248] `[[` <- base::`[[` [15:31:48.248] `+` <- base::`+` [15:31:48.248] `<<-` <- base::`<<-` [15:31:48.248] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:48.248] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:48.248] 3L)] [15:31:48.248] } [15:31:48.248] function(cond) { [15:31:48.248] is_error <- inherits(cond, "error") [15:31:48.248] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:48.248] NULL) [15:31:48.248] if (is_error) { [15:31:48.248] sessionInformation <- function() { [15:31:48.248] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:48.248] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:48.248] search = base::search(), system = base::Sys.info()) [15:31:48.248] } [15:31:48.248] ...future.conditions[[length(...future.conditions) + [15:31:48.248] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:48.248] cond$call), session = sessionInformation(), [15:31:48.248] timestamp = base::Sys.time(), signaled = 0L) [15:31:48.248] signalCondition(cond) [15:31:48.248] } [15:31:48.248] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:48.248] "immediateCondition"))) { [15:31:48.248] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:48.248] ...future.conditions[[length(...future.conditions) + [15:31:48.248] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:48.248] if (TRUE && !signal) { [15:31:48.248] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.248] { [15:31:48.248] inherits <- base::inherits [15:31:48.248] invokeRestart <- base::invokeRestart [15:31:48.248] is.null <- base::is.null [15:31:48.248] muffled <- FALSE [15:31:48.248] if (inherits(cond, "message")) { [15:31:48.248] muffled <- grepl(pattern, "muffleMessage") [15:31:48.248] if (muffled) [15:31:48.248] invokeRestart("muffleMessage") [15:31:48.248] } [15:31:48.248] else if (inherits(cond, "warning")) { [15:31:48.248] muffled <- grepl(pattern, "muffleWarning") [15:31:48.248] if (muffled) [15:31:48.248] invokeRestart("muffleWarning") [15:31:48.248] } [15:31:48.248] else if (inherits(cond, "condition")) { [15:31:48.248] if (!is.null(pattern)) { [15:31:48.248] computeRestarts <- base::computeRestarts [15:31:48.248] grepl <- base::grepl [15:31:48.248] restarts <- computeRestarts(cond) [15:31:48.248] for (restart in restarts) { [15:31:48.248] name <- restart$name [15:31:48.248] if (is.null(name)) [15:31:48.248] next [15:31:48.248] if (!grepl(pattern, name)) [15:31:48.248] next [15:31:48.248] invokeRestart(restart) [15:31:48.248] muffled <- TRUE [15:31:48.248] break [15:31:48.248] } [15:31:48.248] } [15:31:48.248] } [15:31:48.248] invisible(muffled) [15:31:48.248] } [15:31:48.248] muffleCondition(cond, pattern = "^muffle") [15:31:48.248] } [15:31:48.248] } [15:31:48.248] else { [15:31:48.248] if (TRUE) { [15:31:48.248] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.248] { [15:31:48.248] inherits <- base::inherits [15:31:48.248] invokeRestart <- base::invokeRestart [15:31:48.248] is.null <- base::is.null [15:31:48.248] muffled <- FALSE [15:31:48.248] if (inherits(cond, "message")) { [15:31:48.248] muffled <- grepl(pattern, "muffleMessage") [15:31:48.248] if (muffled) [15:31:48.248] invokeRestart("muffleMessage") [15:31:48.248] } [15:31:48.248] else if (inherits(cond, "warning")) { [15:31:48.248] muffled <- grepl(pattern, "muffleWarning") [15:31:48.248] if (muffled) [15:31:48.248] invokeRestart("muffleWarning") [15:31:48.248] } [15:31:48.248] else if (inherits(cond, "condition")) { [15:31:48.248] if (!is.null(pattern)) { [15:31:48.248] computeRestarts <- base::computeRestarts [15:31:48.248] grepl <- base::grepl [15:31:48.248] restarts <- computeRestarts(cond) [15:31:48.248] for (restart in restarts) { [15:31:48.248] name <- restart$name [15:31:48.248] if (is.null(name)) [15:31:48.248] next [15:31:48.248] if (!grepl(pattern, name)) [15:31:48.248] next [15:31:48.248] invokeRestart(restart) [15:31:48.248] muffled <- TRUE [15:31:48.248] break [15:31:48.248] } [15:31:48.248] } [15:31:48.248] } [15:31:48.248] invisible(muffled) [15:31:48.248] } [15:31:48.248] muffleCondition(cond, pattern = "^muffle") [15:31:48.248] } [15:31:48.248] } [15:31:48.248] } [15:31:48.248] })) [15:31:48.248] }, error = function(ex) { [15:31:48.248] base::structure(base::list(value = NULL, visible = NULL, [15:31:48.248] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.248] ...future.rng), started = ...future.startTime, [15:31:48.248] finished = Sys.time(), session_uuid = NA_character_, [15:31:48.248] version = "1.8"), class = "FutureResult") [15:31:48.248] }, finally = { [15:31:48.248] if (!identical(...future.workdir, getwd())) [15:31:48.248] setwd(...future.workdir) [15:31:48.248] { [15:31:48.248] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:48.248] ...future.oldOptions$nwarnings <- NULL [15:31:48.248] } [15:31:48.248] base::options(...future.oldOptions) [15:31:48.248] if (.Platform$OS.type == "windows") { [15:31:48.248] old_names <- names(...future.oldEnvVars) [15:31:48.248] envs <- base::Sys.getenv() [15:31:48.248] names <- names(envs) [15:31:48.248] common <- intersect(names, old_names) [15:31:48.248] added <- setdiff(names, old_names) [15:31:48.248] removed <- setdiff(old_names, names) [15:31:48.248] changed <- common[...future.oldEnvVars[common] != [15:31:48.248] envs[common]] [15:31:48.248] NAMES <- toupper(changed) [15:31:48.248] args <- list() [15:31:48.248] for (kk in seq_along(NAMES)) { [15:31:48.248] name <- changed[[kk]] [15:31:48.248] NAME <- NAMES[[kk]] [15:31:48.248] if (name != NAME && is.element(NAME, old_names)) [15:31:48.248] next [15:31:48.248] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.248] } [15:31:48.248] NAMES <- toupper(added) [15:31:48.248] for (kk in seq_along(NAMES)) { [15:31:48.248] name <- added[[kk]] [15:31:48.248] NAME <- NAMES[[kk]] [15:31:48.248] if (name != NAME && is.element(NAME, old_names)) [15:31:48.248] next [15:31:48.248] args[[name]] <- "" [15:31:48.248] } [15:31:48.248] NAMES <- toupper(removed) [15:31:48.248] for (kk in seq_along(NAMES)) { [15:31:48.248] name <- removed[[kk]] [15:31:48.248] NAME <- NAMES[[kk]] [15:31:48.248] if (name != NAME && is.element(NAME, old_names)) [15:31:48.248] next [15:31:48.248] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.248] } [15:31:48.248] if (length(args) > 0) [15:31:48.248] base::do.call(base::Sys.setenv, args = args) [15:31:48.248] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:48.248] } [15:31:48.248] else { [15:31:48.248] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:48.248] } [15:31:48.248] { [15:31:48.248] if (base::length(...future.futureOptionsAdded) > [15:31:48.248] 0L) { [15:31:48.248] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:48.248] base::names(opts) <- ...future.futureOptionsAdded [15:31:48.248] base::options(opts) [15:31:48.248] } [15:31:48.248] { [15:31:48.248] { [15:31:48.248] NULL [15:31:48.248] RNGkind("Mersenne-Twister") [15:31:48.248] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:48.248] inherits = FALSE) [15:31:48.248] } [15:31:48.248] options(future.plan = NULL) [15:31:48.248] if (is.na(NA_character_)) [15:31:48.248] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.248] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:48.248] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:48.248] .init = FALSE) [15:31:48.248] } [15:31:48.248] } [15:31:48.248] } [15:31:48.248] }) [15:31:48.248] if (TRUE) { [15:31:48.248] base::sink(type = "output", split = FALSE) [15:31:48.248] if (TRUE) { [15:31:48.248] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:48.248] } [15:31:48.248] else { [15:31:48.248] ...future.result["stdout"] <- base::list(NULL) [15:31:48.248] } [15:31:48.248] base::close(...future.stdout) [15:31:48.248] ...future.stdout <- NULL [15:31:48.248] } [15:31:48.248] ...future.result$conditions <- ...future.conditions [15:31:48.248] ...future.result$finished <- base::Sys.time() [15:31:48.248] ...future.result [15:31:48.248] } [15:31:48.254] assign_globals() ... [15:31:48.255] List of 5 [15:31:48.255] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:48.255] $ future.call.arguments :List of 1 [15:31:48.255] ..$ length: int 2 [15:31:48.255] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:48.255] $ ...future.elements_ii :List of 1 [15:31:48.255] ..$ b: chr "numeric" [15:31:48.255] $ ...future.seeds_ii : NULL [15:31:48.255] $ ...future.globals.maxSize: NULL [15:31:48.255] - attr(*, "where")=List of 5 [15:31:48.255] ..$ ...future.FUN : [15:31:48.255] ..$ future.call.arguments : [15:31:48.255] ..$ ...future.elements_ii : [15:31:48.255] ..$ ...future.seeds_ii : [15:31:48.255] ..$ ...future.globals.maxSize: [15:31:48.255] - attr(*, "resolved")= logi FALSE [15:31:48.255] - attr(*, "total_size")= num 2240 [15:31:48.255] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:48.255] - attr(*, "already-done")= logi TRUE [15:31:48.265] - copied '...future.FUN' to environment [15:31:48.265] - copied 'future.call.arguments' to environment [15:31:48.266] - copied '...future.elements_ii' to environment [15:31:48.266] - copied '...future.seeds_ii' to environment [15:31:48.266] - copied '...future.globals.maxSize' to environment [15:31:48.267] assign_globals() ... done [15:31:48.267] plan(): Setting new future strategy stack: [15:31:48.267] List of future strategies: [15:31:48.267] 1. sequential: [15:31:48.267] - args: function (..., envir = parent.frame(), workers = "") [15:31:48.267] - tweaked: FALSE [15:31:48.267] - call: NULL [15:31:48.268] plan(): nbrOfWorkers() = 1 [15:31:48.271] plan(): Setting new future strategy stack: [15:31:48.271] List of future strategies: [15:31:48.271] 1. multisession: [15:31:48.271] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:48.271] - tweaked: FALSE [15:31:48.271] - call: plan(strategy) [15:31:48.275] plan(): nbrOfWorkers() = 1 [15:31:48.275] SequentialFuture started (and completed) [15:31:48.276] - Launch lazy future ... done [15:31:48.276] run() for 'SequentialFuture' ... done [15:31:48.276] Created future: [15:31:48.277] SequentialFuture: [15:31:48.277] Label: 'future_lapply-2' [15:31:48.277] Expression: [15:31:48.277] { [15:31:48.277] do.call(function(...) { [15:31:48.277] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.277] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.277] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.277] on.exit(options(oopts), add = TRUE) [15:31:48.277] } [15:31:48.277] { [15:31:48.277] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.277] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.277] ...future.FUN(...future.X_jj, ...) [15:31:48.277] }) [15:31:48.277] } [15:31:48.277] }, args = future.call.arguments) [15:31:48.277] } [15:31:48.277] Lazy evaluation: FALSE [15:31:48.277] Asynchronous evaluation: FALSE [15:31:48.277] Local evaluation: TRUE [15:31:48.277] Environment: R_GlobalEnv [15:31:48.277] Capture standard output: TRUE [15:31:48.277] Capture condition classes: 'condition' (excluding 'nothing') [15:31:48.277] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:48.277] Packages: [15:31:48.277] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:48.277] Resolved: TRUE [15:31:48.277] Value: 64 bytes of class 'list' [15:31:48.277] Early signaling: FALSE [15:31:48.277] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:48.277] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.279] Chunk #2 of 4 ... DONE [15:31:48.279] Chunk #3 of 4 ... [15:31:48.280] - Finding globals in 'X' for chunk #3 ... [15:31:48.280] getGlobalsAndPackages() ... [15:31:48.280] Searching for globals... [15:31:48.281] [15:31:48.281] Searching for globals ... DONE [15:31:48.281] - globals: [0] [15:31:48.282] getGlobalsAndPackages() ... DONE [15:31:48.282] + additional globals found: [n=0] [15:31:48.282] + additional namespaces needed: [n=0] [15:31:48.283] - Finding globals in 'X' for chunk #3 ... DONE [15:31:48.283] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:48.283] - seeds: [15:31:48.283] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.284] getGlobalsAndPackages() ... [15:31:48.284] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.284] Resolving globals: FALSE [15:31:48.285] Tweak future expression to call with '...' arguments ... [15:31:48.285] { [15:31:48.285] do.call(function(...) { [15:31:48.285] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.285] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.285] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.285] on.exit(options(oopts), add = TRUE) [15:31:48.285] } [15:31:48.285] { [15:31:48.285] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.285] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.285] ...future.FUN(...future.X_jj, ...) [15:31:48.285] }) [15:31:48.285] } [15:31:48.285] }, args = future.call.arguments) [15:31:48.285] } [15:31:48.286] Tweak future expression to call with '...' arguments ... DONE [15:31:48.287] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.287] [15:31:48.287] getGlobalsAndPackages() ... DONE [15:31:48.288] run() for 'Future' ... [15:31:48.288] - state: 'created' [15:31:48.288] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:48.292] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.293] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:48.293] - Field: 'label' [15:31:48.293] - Field: 'local' [15:31:48.294] - Field: 'owner' [15:31:48.294] - Field: 'envir' [15:31:48.294] - Field: 'packages' [15:31:48.295] - Field: 'gc' [15:31:48.295] - Field: 'conditions' [15:31:48.295] - Field: 'expr' [15:31:48.295] - Field: 'uuid' [15:31:48.296] - Field: 'seed' [15:31:48.296] - Field: 'version' [15:31:48.296] - Field: 'result' [15:31:48.297] - Field: 'asynchronous' [15:31:48.297] - Field: 'calls' [15:31:48.297] - Field: 'globals' [15:31:48.298] - Field: 'stdout' [15:31:48.298] - Field: 'earlySignal' [15:31:48.298] - Field: 'lazy' [15:31:48.299] - Field: 'state' [15:31:48.299] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:48.299] - Launch lazy future ... [15:31:48.300] Packages needed by the future expression (n = 0): [15:31:48.300] Packages needed by future strategies (n = 0): [15:31:48.301] { [15:31:48.301] { [15:31:48.301] { [15:31:48.301] ...future.startTime <- base::Sys.time() [15:31:48.301] { [15:31:48.301] { [15:31:48.301] { [15:31:48.301] base::local({ [15:31:48.301] has_future <- base::requireNamespace("future", [15:31:48.301] quietly = TRUE) [15:31:48.301] if (has_future) { [15:31:48.301] ns <- base::getNamespace("future") [15:31:48.301] version <- ns[[".package"]][["version"]] [15:31:48.301] if (is.null(version)) [15:31:48.301] version <- utils::packageVersion("future") [15:31:48.301] } [15:31:48.301] else { [15:31:48.301] version <- NULL [15:31:48.301] } [15:31:48.301] if (!has_future || version < "1.8.0") { [15:31:48.301] info <- base::c(r_version = base::gsub("R version ", [15:31:48.301] "", base::R.version$version.string), [15:31:48.301] platform = base::sprintf("%s (%s-bit)", [15:31:48.301] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:48.301] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:48.301] "release", "version")], collapse = " "), [15:31:48.301] hostname = base::Sys.info()[["nodename"]]) [15:31:48.301] info <- base::sprintf("%s: %s", base::names(info), [15:31:48.301] info) [15:31:48.301] info <- base::paste(info, collapse = "; ") [15:31:48.301] if (!has_future) { [15:31:48.301] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:48.301] info) [15:31:48.301] } [15:31:48.301] else { [15:31:48.301] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:48.301] info, version) [15:31:48.301] } [15:31:48.301] base::stop(msg) [15:31:48.301] } [15:31:48.301] }) [15:31:48.301] } [15:31:48.301] ...future.strategy.old <- future::plan("list") [15:31:48.301] options(future.plan = NULL) [15:31:48.301] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.301] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:48.301] } [15:31:48.301] ...future.workdir <- getwd() [15:31:48.301] } [15:31:48.301] ...future.oldOptions <- base::as.list(base::.Options) [15:31:48.301] ...future.oldEnvVars <- base::Sys.getenv() [15:31:48.301] } [15:31:48.301] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:48.301] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:48.301] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:48.301] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:48.301] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:48.301] future.stdout.windows.reencode = NULL, width = 80L) [15:31:48.301] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:48.301] base::names(...future.oldOptions)) [15:31:48.301] } [15:31:48.301] if (FALSE) { [15:31:48.301] } [15:31:48.301] else { [15:31:48.301] if (TRUE) { [15:31:48.301] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:48.301] open = "w") [15:31:48.301] } [15:31:48.301] else { [15:31:48.301] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:48.301] windows = "NUL", "/dev/null"), open = "w") [15:31:48.301] } [15:31:48.301] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:48.301] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:48.301] base::sink(type = "output", split = FALSE) [15:31:48.301] base::close(...future.stdout) [15:31:48.301] }, add = TRUE) [15:31:48.301] } [15:31:48.301] ...future.frame <- base::sys.nframe() [15:31:48.301] ...future.conditions <- base::list() [15:31:48.301] ...future.rng <- base::globalenv()$.Random.seed [15:31:48.301] if (FALSE) { [15:31:48.301] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:48.301] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:48.301] } [15:31:48.301] ...future.result <- base::tryCatch({ [15:31:48.301] base::withCallingHandlers({ [15:31:48.301] ...future.value <- base::withVisible(base::local({ [15:31:48.301] do.call(function(...) { [15:31:48.301] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.301] if (!identical(...future.globals.maxSize.org, [15:31:48.301] ...future.globals.maxSize)) { [15:31:48.301] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.301] on.exit(options(oopts), add = TRUE) [15:31:48.301] } [15:31:48.301] { [15:31:48.301] lapply(seq_along(...future.elements_ii), [15:31:48.301] FUN = function(jj) { [15:31:48.301] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.301] ...future.FUN(...future.X_jj, ...) [15:31:48.301] }) [15:31:48.301] } [15:31:48.301] }, args = future.call.arguments) [15:31:48.301] })) [15:31:48.301] future::FutureResult(value = ...future.value$value, [15:31:48.301] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.301] ...future.rng), globalenv = if (FALSE) [15:31:48.301] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:48.301] ...future.globalenv.names)) [15:31:48.301] else NULL, started = ...future.startTime, version = "1.8") [15:31:48.301] }, condition = base::local({ [15:31:48.301] c <- base::c [15:31:48.301] inherits <- base::inherits [15:31:48.301] invokeRestart <- base::invokeRestart [15:31:48.301] length <- base::length [15:31:48.301] list <- base::list [15:31:48.301] seq.int <- base::seq.int [15:31:48.301] signalCondition <- base::signalCondition [15:31:48.301] sys.calls <- base::sys.calls [15:31:48.301] `[[` <- base::`[[` [15:31:48.301] `+` <- base::`+` [15:31:48.301] `<<-` <- base::`<<-` [15:31:48.301] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:48.301] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:48.301] 3L)] [15:31:48.301] } [15:31:48.301] function(cond) { [15:31:48.301] is_error <- inherits(cond, "error") [15:31:48.301] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:48.301] NULL) [15:31:48.301] if (is_error) { [15:31:48.301] sessionInformation <- function() { [15:31:48.301] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:48.301] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:48.301] search = base::search(), system = base::Sys.info()) [15:31:48.301] } [15:31:48.301] ...future.conditions[[length(...future.conditions) + [15:31:48.301] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:48.301] cond$call), session = sessionInformation(), [15:31:48.301] timestamp = base::Sys.time(), signaled = 0L) [15:31:48.301] signalCondition(cond) [15:31:48.301] } [15:31:48.301] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:48.301] "immediateCondition"))) { [15:31:48.301] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:48.301] ...future.conditions[[length(...future.conditions) + [15:31:48.301] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:48.301] if (TRUE && !signal) { [15:31:48.301] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.301] { [15:31:48.301] inherits <- base::inherits [15:31:48.301] invokeRestart <- base::invokeRestart [15:31:48.301] is.null <- base::is.null [15:31:48.301] muffled <- FALSE [15:31:48.301] if (inherits(cond, "message")) { [15:31:48.301] muffled <- grepl(pattern, "muffleMessage") [15:31:48.301] if (muffled) [15:31:48.301] invokeRestart("muffleMessage") [15:31:48.301] } [15:31:48.301] else if (inherits(cond, "warning")) { [15:31:48.301] muffled <- grepl(pattern, "muffleWarning") [15:31:48.301] if (muffled) [15:31:48.301] invokeRestart("muffleWarning") [15:31:48.301] } [15:31:48.301] else if (inherits(cond, "condition")) { [15:31:48.301] if (!is.null(pattern)) { [15:31:48.301] computeRestarts <- base::computeRestarts [15:31:48.301] grepl <- base::grepl [15:31:48.301] restarts <- computeRestarts(cond) [15:31:48.301] for (restart in restarts) { [15:31:48.301] name <- restart$name [15:31:48.301] if (is.null(name)) [15:31:48.301] next [15:31:48.301] if (!grepl(pattern, name)) [15:31:48.301] next [15:31:48.301] invokeRestart(restart) [15:31:48.301] muffled <- TRUE [15:31:48.301] break [15:31:48.301] } [15:31:48.301] } [15:31:48.301] } [15:31:48.301] invisible(muffled) [15:31:48.301] } [15:31:48.301] muffleCondition(cond, pattern = "^muffle") [15:31:48.301] } [15:31:48.301] } [15:31:48.301] else { [15:31:48.301] if (TRUE) { [15:31:48.301] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.301] { [15:31:48.301] inherits <- base::inherits [15:31:48.301] invokeRestart <- base::invokeRestart [15:31:48.301] is.null <- base::is.null [15:31:48.301] muffled <- FALSE [15:31:48.301] if (inherits(cond, "message")) { [15:31:48.301] muffled <- grepl(pattern, "muffleMessage") [15:31:48.301] if (muffled) [15:31:48.301] invokeRestart("muffleMessage") [15:31:48.301] } [15:31:48.301] else if (inherits(cond, "warning")) { [15:31:48.301] muffled <- grepl(pattern, "muffleWarning") [15:31:48.301] if (muffled) [15:31:48.301] invokeRestart("muffleWarning") [15:31:48.301] } [15:31:48.301] else if (inherits(cond, "condition")) { [15:31:48.301] if (!is.null(pattern)) { [15:31:48.301] computeRestarts <- base::computeRestarts [15:31:48.301] grepl <- base::grepl [15:31:48.301] restarts <- computeRestarts(cond) [15:31:48.301] for (restart in restarts) { [15:31:48.301] name <- restart$name [15:31:48.301] if (is.null(name)) [15:31:48.301] next [15:31:48.301] if (!grepl(pattern, name)) [15:31:48.301] next [15:31:48.301] invokeRestart(restart) [15:31:48.301] muffled <- TRUE [15:31:48.301] break [15:31:48.301] } [15:31:48.301] } [15:31:48.301] } [15:31:48.301] invisible(muffled) [15:31:48.301] } [15:31:48.301] muffleCondition(cond, pattern = "^muffle") [15:31:48.301] } [15:31:48.301] } [15:31:48.301] } [15:31:48.301] })) [15:31:48.301] }, error = function(ex) { [15:31:48.301] base::structure(base::list(value = NULL, visible = NULL, [15:31:48.301] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.301] ...future.rng), started = ...future.startTime, [15:31:48.301] finished = Sys.time(), session_uuid = NA_character_, [15:31:48.301] version = "1.8"), class = "FutureResult") [15:31:48.301] }, finally = { [15:31:48.301] if (!identical(...future.workdir, getwd())) [15:31:48.301] setwd(...future.workdir) [15:31:48.301] { [15:31:48.301] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:48.301] ...future.oldOptions$nwarnings <- NULL [15:31:48.301] } [15:31:48.301] base::options(...future.oldOptions) [15:31:48.301] if (.Platform$OS.type == "windows") { [15:31:48.301] old_names <- names(...future.oldEnvVars) [15:31:48.301] envs <- base::Sys.getenv() [15:31:48.301] names <- names(envs) [15:31:48.301] common <- intersect(names, old_names) [15:31:48.301] added <- setdiff(names, old_names) [15:31:48.301] removed <- setdiff(old_names, names) [15:31:48.301] changed <- common[...future.oldEnvVars[common] != [15:31:48.301] envs[common]] [15:31:48.301] NAMES <- toupper(changed) [15:31:48.301] args <- list() [15:31:48.301] for (kk in seq_along(NAMES)) { [15:31:48.301] name <- changed[[kk]] [15:31:48.301] NAME <- NAMES[[kk]] [15:31:48.301] if (name != NAME && is.element(NAME, old_names)) [15:31:48.301] next [15:31:48.301] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.301] } [15:31:48.301] NAMES <- toupper(added) [15:31:48.301] for (kk in seq_along(NAMES)) { [15:31:48.301] name <- added[[kk]] [15:31:48.301] NAME <- NAMES[[kk]] [15:31:48.301] if (name != NAME && is.element(NAME, old_names)) [15:31:48.301] next [15:31:48.301] args[[name]] <- "" [15:31:48.301] } [15:31:48.301] NAMES <- toupper(removed) [15:31:48.301] for (kk in seq_along(NAMES)) { [15:31:48.301] name <- removed[[kk]] [15:31:48.301] NAME <- NAMES[[kk]] [15:31:48.301] if (name != NAME && is.element(NAME, old_names)) [15:31:48.301] next [15:31:48.301] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.301] } [15:31:48.301] if (length(args) > 0) [15:31:48.301] base::do.call(base::Sys.setenv, args = args) [15:31:48.301] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:48.301] } [15:31:48.301] else { [15:31:48.301] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:48.301] } [15:31:48.301] { [15:31:48.301] if (base::length(...future.futureOptionsAdded) > [15:31:48.301] 0L) { [15:31:48.301] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:48.301] base::names(opts) <- ...future.futureOptionsAdded [15:31:48.301] base::options(opts) [15:31:48.301] } [15:31:48.301] { [15:31:48.301] { [15:31:48.301] NULL [15:31:48.301] RNGkind("Mersenne-Twister") [15:31:48.301] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:48.301] inherits = FALSE) [15:31:48.301] } [15:31:48.301] options(future.plan = NULL) [15:31:48.301] if (is.na(NA_character_)) [15:31:48.301] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.301] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:48.301] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:48.301] .init = FALSE) [15:31:48.301] } [15:31:48.301] } [15:31:48.301] } [15:31:48.301] }) [15:31:48.301] if (TRUE) { [15:31:48.301] base::sink(type = "output", split = FALSE) [15:31:48.301] if (TRUE) { [15:31:48.301] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:48.301] } [15:31:48.301] else { [15:31:48.301] ...future.result["stdout"] <- base::list(NULL) [15:31:48.301] } [15:31:48.301] base::close(...future.stdout) [15:31:48.301] ...future.stdout <- NULL [15:31:48.301] } [15:31:48.301] ...future.result$conditions <- ...future.conditions [15:31:48.301] ...future.result$finished <- base::Sys.time() [15:31:48.301] ...future.result [15:31:48.301] } [15:31:48.308] assign_globals() ... [15:31:48.308] List of 5 [15:31:48.308] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:48.308] $ future.call.arguments :List of 1 [15:31:48.308] ..$ length: int 2 [15:31:48.308] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:48.308] $ ...future.elements_ii :List of 1 [15:31:48.308] ..$ c: chr "character" [15:31:48.308] $ ...future.seeds_ii : NULL [15:31:48.308] $ ...future.globals.maxSize: NULL [15:31:48.308] - attr(*, "where")=List of 5 [15:31:48.308] ..$ ...future.FUN : [15:31:48.308] ..$ future.call.arguments : [15:31:48.308] ..$ ...future.elements_ii : [15:31:48.308] ..$ ...future.seeds_ii : [15:31:48.308] ..$ ...future.globals.maxSize: [15:31:48.308] - attr(*, "resolved")= logi FALSE [15:31:48.308] - attr(*, "total_size")= num 2240 [15:31:48.308] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:48.308] - attr(*, "already-done")= logi TRUE [15:31:48.319] - copied '...future.FUN' to environment [15:31:48.319] - copied 'future.call.arguments' to environment [15:31:48.319] - copied '...future.elements_ii' to environment [15:31:48.320] - copied '...future.seeds_ii' to environment [15:31:48.320] - copied '...future.globals.maxSize' to environment [15:31:48.320] assign_globals() ... done [15:31:48.321] plan(): Setting new future strategy stack: [15:31:48.321] List of future strategies: [15:31:48.321] 1. sequential: [15:31:48.321] - args: function (..., envir = parent.frame(), workers = "") [15:31:48.321] - tweaked: FALSE [15:31:48.321] - call: NULL [15:31:48.322] plan(): nbrOfWorkers() = 1 [15:31:48.324] plan(): Setting new future strategy stack: [15:31:48.325] List of future strategies: [15:31:48.325] 1. multisession: [15:31:48.325] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:48.325] - tweaked: FALSE [15:31:48.325] - call: plan(strategy) [15:31:48.329] plan(): nbrOfWorkers() = 1 [15:31:48.329] SequentialFuture started (and completed) [15:31:48.330] - Launch lazy future ... done [15:31:48.330] run() for 'SequentialFuture' ... done [15:31:48.330] Created future: [15:31:48.331] SequentialFuture: [15:31:48.331] Label: 'future_lapply-3' [15:31:48.331] Expression: [15:31:48.331] { [15:31:48.331] do.call(function(...) { [15:31:48.331] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.331] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.331] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.331] on.exit(options(oopts), add = TRUE) [15:31:48.331] } [15:31:48.331] { [15:31:48.331] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.331] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.331] ...future.FUN(...future.X_jj, ...) [15:31:48.331] }) [15:31:48.331] } [15:31:48.331] }, args = future.call.arguments) [15:31:48.331] } [15:31:48.331] Lazy evaluation: FALSE [15:31:48.331] Asynchronous evaluation: FALSE [15:31:48.331] Local evaluation: TRUE [15:31:48.331] Environment: R_GlobalEnv [15:31:48.331] Capture standard output: TRUE [15:31:48.331] Capture condition classes: 'condition' (excluding 'nothing') [15:31:48.331] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 120 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:48.331] Packages: [15:31:48.331] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:48.331] Resolved: TRUE [15:31:48.331] Value: 120 bytes of class 'list' [15:31:48.331] Early signaling: FALSE [15:31:48.331] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:48.331] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.333] Chunk #3 of 4 ... DONE [15:31:48.333] Chunk #4 of 4 ... [15:31:48.334] - Finding globals in 'X' for chunk #4 ... [15:31:48.334] getGlobalsAndPackages() ... [15:31:48.334] Searching for globals... [15:31:48.335] [15:31:48.335] Searching for globals ... DONE [15:31:48.335] - globals: [0] [15:31:48.336] getGlobalsAndPackages() ... DONE [15:31:48.336] + additional globals found: [n=0] [15:31:48.336] + additional namespaces needed: [n=0] [15:31:48.336] - Finding globals in 'X' for chunk #4 ... DONE [15:31:48.337] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:48.337] - seeds: [15:31:48.337] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.338] getGlobalsAndPackages() ... [15:31:48.338] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.338] Resolving globals: FALSE [15:31:48.338] Tweak future expression to call with '...' arguments ... [15:31:48.339] { [15:31:48.339] do.call(function(...) { [15:31:48.339] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.339] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.339] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.339] on.exit(options(oopts), add = TRUE) [15:31:48.339] } [15:31:48.339] { [15:31:48.339] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.339] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.339] ...future.FUN(...future.X_jj, ...) [15:31:48.339] }) [15:31:48.339] } [15:31:48.339] }, args = future.call.arguments) [15:31:48.339] } [15:31:48.340] Tweak future expression to call with '...' arguments ... DONE [15:31:48.340] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.341] [15:31:48.341] getGlobalsAndPackages() ... DONE [15:31:48.342] run() for 'Future' ... [15:31:48.342] - state: 'created' [15:31:48.342] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:48.347] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.347] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:48.347] - Field: 'label' [15:31:48.348] - Field: 'local' [15:31:48.348] - Field: 'owner' [15:31:48.348] - Field: 'envir' [15:31:48.348] - Field: 'packages' [15:31:48.349] - Field: 'gc' [15:31:48.349] - Field: 'conditions' [15:31:48.349] - Field: 'expr' [15:31:48.350] - Field: 'uuid' [15:31:48.350] - Field: 'seed' [15:31:48.350] - Field: 'version' [15:31:48.351] - Field: 'result' [15:31:48.351] - Field: 'asynchronous' [15:31:48.351] - Field: 'calls' [15:31:48.352] - Field: 'globals' [15:31:48.352] - Field: 'stdout' [15:31:48.352] - Field: 'earlySignal' [15:31:48.352] - Field: 'lazy' [15:31:48.353] - Field: 'state' [15:31:48.353] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:48.353] - Launch lazy future ... [15:31:48.354] Packages needed by the future expression (n = 0): [15:31:48.354] Packages needed by future strategies (n = 0): [15:31:48.355] { [15:31:48.355] { [15:31:48.355] { [15:31:48.355] ...future.startTime <- base::Sys.time() [15:31:48.355] { [15:31:48.355] { [15:31:48.355] { [15:31:48.355] base::local({ [15:31:48.355] has_future <- base::requireNamespace("future", [15:31:48.355] quietly = TRUE) [15:31:48.355] if (has_future) { [15:31:48.355] ns <- base::getNamespace("future") [15:31:48.355] version <- ns[[".package"]][["version"]] [15:31:48.355] if (is.null(version)) [15:31:48.355] version <- utils::packageVersion("future") [15:31:48.355] } [15:31:48.355] else { [15:31:48.355] version <- NULL [15:31:48.355] } [15:31:48.355] if (!has_future || version < "1.8.0") { [15:31:48.355] info <- base::c(r_version = base::gsub("R version ", [15:31:48.355] "", base::R.version$version.string), [15:31:48.355] platform = base::sprintf("%s (%s-bit)", [15:31:48.355] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:48.355] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:48.355] "release", "version")], collapse = " "), [15:31:48.355] hostname = base::Sys.info()[["nodename"]]) [15:31:48.355] info <- base::sprintf("%s: %s", base::names(info), [15:31:48.355] info) [15:31:48.355] info <- base::paste(info, collapse = "; ") [15:31:48.355] if (!has_future) { [15:31:48.355] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:48.355] info) [15:31:48.355] } [15:31:48.355] else { [15:31:48.355] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:48.355] info, version) [15:31:48.355] } [15:31:48.355] base::stop(msg) [15:31:48.355] } [15:31:48.355] }) [15:31:48.355] } [15:31:48.355] ...future.strategy.old <- future::plan("list") [15:31:48.355] options(future.plan = NULL) [15:31:48.355] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.355] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:48.355] } [15:31:48.355] ...future.workdir <- getwd() [15:31:48.355] } [15:31:48.355] ...future.oldOptions <- base::as.list(base::.Options) [15:31:48.355] ...future.oldEnvVars <- base::Sys.getenv() [15:31:48.355] } [15:31:48.355] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:48.355] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:48.355] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:48.355] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:48.355] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:48.355] future.stdout.windows.reencode = NULL, width = 80L) [15:31:48.355] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:48.355] base::names(...future.oldOptions)) [15:31:48.355] } [15:31:48.355] if (FALSE) { [15:31:48.355] } [15:31:48.355] else { [15:31:48.355] if (TRUE) { [15:31:48.355] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:48.355] open = "w") [15:31:48.355] } [15:31:48.355] else { [15:31:48.355] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:48.355] windows = "NUL", "/dev/null"), open = "w") [15:31:48.355] } [15:31:48.355] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:48.355] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:48.355] base::sink(type = "output", split = FALSE) [15:31:48.355] base::close(...future.stdout) [15:31:48.355] }, add = TRUE) [15:31:48.355] } [15:31:48.355] ...future.frame <- base::sys.nframe() [15:31:48.355] ...future.conditions <- base::list() [15:31:48.355] ...future.rng <- base::globalenv()$.Random.seed [15:31:48.355] if (FALSE) { [15:31:48.355] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:48.355] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:48.355] } [15:31:48.355] ...future.result <- base::tryCatch({ [15:31:48.355] base::withCallingHandlers({ [15:31:48.355] ...future.value <- base::withVisible(base::local({ [15:31:48.355] do.call(function(...) { [15:31:48.355] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.355] if (!identical(...future.globals.maxSize.org, [15:31:48.355] ...future.globals.maxSize)) { [15:31:48.355] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.355] on.exit(options(oopts), add = TRUE) [15:31:48.355] } [15:31:48.355] { [15:31:48.355] lapply(seq_along(...future.elements_ii), [15:31:48.355] FUN = function(jj) { [15:31:48.355] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.355] ...future.FUN(...future.X_jj, ...) [15:31:48.355] }) [15:31:48.355] } [15:31:48.355] }, args = future.call.arguments) [15:31:48.355] })) [15:31:48.355] future::FutureResult(value = ...future.value$value, [15:31:48.355] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.355] ...future.rng), globalenv = if (FALSE) [15:31:48.355] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:48.355] ...future.globalenv.names)) [15:31:48.355] else NULL, started = ...future.startTime, version = "1.8") [15:31:48.355] }, condition = base::local({ [15:31:48.355] c <- base::c [15:31:48.355] inherits <- base::inherits [15:31:48.355] invokeRestart <- base::invokeRestart [15:31:48.355] length <- base::length [15:31:48.355] list <- base::list [15:31:48.355] seq.int <- base::seq.int [15:31:48.355] signalCondition <- base::signalCondition [15:31:48.355] sys.calls <- base::sys.calls [15:31:48.355] `[[` <- base::`[[` [15:31:48.355] `+` <- base::`+` [15:31:48.355] `<<-` <- base::`<<-` [15:31:48.355] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:48.355] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:48.355] 3L)] [15:31:48.355] } [15:31:48.355] function(cond) { [15:31:48.355] is_error <- inherits(cond, "error") [15:31:48.355] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:48.355] NULL) [15:31:48.355] if (is_error) { [15:31:48.355] sessionInformation <- function() { [15:31:48.355] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:48.355] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:48.355] search = base::search(), system = base::Sys.info()) [15:31:48.355] } [15:31:48.355] ...future.conditions[[length(...future.conditions) + [15:31:48.355] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:48.355] cond$call), session = sessionInformation(), [15:31:48.355] timestamp = base::Sys.time(), signaled = 0L) [15:31:48.355] signalCondition(cond) [15:31:48.355] } [15:31:48.355] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:48.355] "immediateCondition"))) { [15:31:48.355] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:48.355] ...future.conditions[[length(...future.conditions) + [15:31:48.355] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:48.355] if (TRUE && !signal) { [15:31:48.355] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.355] { [15:31:48.355] inherits <- base::inherits [15:31:48.355] invokeRestart <- base::invokeRestart [15:31:48.355] is.null <- base::is.null [15:31:48.355] muffled <- FALSE [15:31:48.355] if (inherits(cond, "message")) { [15:31:48.355] muffled <- grepl(pattern, "muffleMessage") [15:31:48.355] if (muffled) [15:31:48.355] invokeRestart("muffleMessage") [15:31:48.355] } [15:31:48.355] else if (inherits(cond, "warning")) { [15:31:48.355] muffled <- grepl(pattern, "muffleWarning") [15:31:48.355] if (muffled) [15:31:48.355] invokeRestart("muffleWarning") [15:31:48.355] } [15:31:48.355] else if (inherits(cond, "condition")) { [15:31:48.355] if (!is.null(pattern)) { [15:31:48.355] computeRestarts <- base::computeRestarts [15:31:48.355] grepl <- base::grepl [15:31:48.355] restarts <- computeRestarts(cond) [15:31:48.355] for (restart in restarts) { [15:31:48.355] name <- restart$name [15:31:48.355] if (is.null(name)) [15:31:48.355] next [15:31:48.355] if (!grepl(pattern, name)) [15:31:48.355] next [15:31:48.355] invokeRestart(restart) [15:31:48.355] muffled <- TRUE [15:31:48.355] break [15:31:48.355] } [15:31:48.355] } [15:31:48.355] } [15:31:48.355] invisible(muffled) [15:31:48.355] } [15:31:48.355] muffleCondition(cond, pattern = "^muffle") [15:31:48.355] } [15:31:48.355] } [15:31:48.355] else { [15:31:48.355] if (TRUE) { [15:31:48.355] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.355] { [15:31:48.355] inherits <- base::inherits [15:31:48.355] invokeRestart <- base::invokeRestart [15:31:48.355] is.null <- base::is.null [15:31:48.355] muffled <- FALSE [15:31:48.355] if (inherits(cond, "message")) { [15:31:48.355] muffled <- grepl(pattern, "muffleMessage") [15:31:48.355] if (muffled) [15:31:48.355] invokeRestart("muffleMessage") [15:31:48.355] } [15:31:48.355] else if (inherits(cond, "warning")) { [15:31:48.355] muffled <- grepl(pattern, "muffleWarning") [15:31:48.355] if (muffled) [15:31:48.355] invokeRestart("muffleWarning") [15:31:48.355] } [15:31:48.355] else if (inherits(cond, "condition")) { [15:31:48.355] if (!is.null(pattern)) { [15:31:48.355] computeRestarts <- base::computeRestarts [15:31:48.355] grepl <- base::grepl [15:31:48.355] restarts <- computeRestarts(cond) [15:31:48.355] for (restart in restarts) { [15:31:48.355] name <- restart$name [15:31:48.355] if (is.null(name)) [15:31:48.355] next [15:31:48.355] if (!grepl(pattern, name)) [15:31:48.355] next [15:31:48.355] invokeRestart(restart) [15:31:48.355] muffled <- TRUE [15:31:48.355] break [15:31:48.355] } [15:31:48.355] } [15:31:48.355] } [15:31:48.355] invisible(muffled) [15:31:48.355] } [15:31:48.355] muffleCondition(cond, pattern = "^muffle") [15:31:48.355] } [15:31:48.355] } [15:31:48.355] } [15:31:48.355] })) [15:31:48.355] }, error = function(ex) { [15:31:48.355] base::structure(base::list(value = NULL, visible = NULL, [15:31:48.355] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.355] ...future.rng), started = ...future.startTime, [15:31:48.355] finished = Sys.time(), session_uuid = NA_character_, [15:31:48.355] version = "1.8"), class = "FutureResult") [15:31:48.355] }, finally = { [15:31:48.355] if (!identical(...future.workdir, getwd())) [15:31:48.355] setwd(...future.workdir) [15:31:48.355] { [15:31:48.355] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:48.355] ...future.oldOptions$nwarnings <- NULL [15:31:48.355] } [15:31:48.355] base::options(...future.oldOptions) [15:31:48.355] if (.Platform$OS.type == "windows") { [15:31:48.355] old_names <- names(...future.oldEnvVars) [15:31:48.355] envs <- base::Sys.getenv() [15:31:48.355] names <- names(envs) [15:31:48.355] common <- intersect(names, old_names) [15:31:48.355] added <- setdiff(names, old_names) [15:31:48.355] removed <- setdiff(old_names, names) [15:31:48.355] changed <- common[...future.oldEnvVars[common] != [15:31:48.355] envs[common]] [15:31:48.355] NAMES <- toupper(changed) [15:31:48.355] args <- list() [15:31:48.355] for (kk in seq_along(NAMES)) { [15:31:48.355] name <- changed[[kk]] [15:31:48.355] NAME <- NAMES[[kk]] [15:31:48.355] if (name != NAME && is.element(NAME, old_names)) [15:31:48.355] next [15:31:48.355] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.355] } [15:31:48.355] NAMES <- toupper(added) [15:31:48.355] for (kk in seq_along(NAMES)) { [15:31:48.355] name <- added[[kk]] [15:31:48.355] NAME <- NAMES[[kk]] [15:31:48.355] if (name != NAME && is.element(NAME, old_names)) [15:31:48.355] next [15:31:48.355] args[[name]] <- "" [15:31:48.355] } [15:31:48.355] NAMES <- toupper(removed) [15:31:48.355] for (kk in seq_along(NAMES)) { [15:31:48.355] name <- removed[[kk]] [15:31:48.355] NAME <- NAMES[[kk]] [15:31:48.355] if (name != NAME && is.element(NAME, old_names)) [15:31:48.355] next [15:31:48.355] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.355] } [15:31:48.355] if (length(args) > 0) [15:31:48.355] base::do.call(base::Sys.setenv, args = args) [15:31:48.355] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:48.355] } [15:31:48.355] else { [15:31:48.355] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:48.355] } [15:31:48.355] { [15:31:48.355] if (base::length(...future.futureOptionsAdded) > [15:31:48.355] 0L) { [15:31:48.355] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:48.355] base::names(opts) <- ...future.futureOptionsAdded [15:31:48.355] base::options(opts) [15:31:48.355] } [15:31:48.355] { [15:31:48.355] { [15:31:48.355] NULL [15:31:48.355] RNGkind("Mersenne-Twister") [15:31:48.355] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:48.355] inherits = FALSE) [15:31:48.355] } [15:31:48.355] options(future.plan = NULL) [15:31:48.355] if (is.na(NA_character_)) [15:31:48.355] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.355] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:48.355] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:48.355] .init = FALSE) [15:31:48.355] } [15:31:48.355] } [15:31:48.355] } [15:31:48.355] }) [15:31:48.355] if (TRUE) { [15:31:48.355] base::sink(type = "output", split = FALSE) [15:31:48.355] if (TRUE) { [15:31:48.355] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:48.355] } [15:31:48.355] else { [15:31:48.355] ...future.result["stdout"] <- base::list(NULL) [15:31:48.355] } [15:31:48.355] base::close(...future.stdout) [15:31:48.355] ...future.stdout <- NULL [15:31:48.355] } [15:31:48.355] ...future.result$conditions <- ...future.conditions [15:31:48.355] ...future.result$finished <- base::Sys.time() [15:31:48.355] ...future.result [15:31:48.355] } [15:31:48.362] assign_globals() ... [15:31:48.362] List of 5 [15:31:48.362] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:48.362] $ future.call.arguments :List of 1 [15:31:48.362] ..$ length: int 2 [15:31:48.362] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:48.362] $ ...future.elements_ii :List of 1 [15:31:48.362] ..$ c: chr "list" [15:31:48.362] $ ...future.seeds_ii : NULL [15:31:48.362] $ ...future.globals.maxSize: NULL [15:31:48.362] - attr(*, "where")=List of 5 [15:31:48.362] ..$ ...future.FUN : [15:31:48.362] ..$ future.call.arguments : [15:31:48.362] ..$ ...future.elements_ii : [15:31:48.362] ..$ ...future.seeds_ii : [15:31:48.362] ..$ ...future.globals.maxSize: [15:31:48.362] - attr(*, "resolved")= logi FALSE [15:31:48.362] - attr(*, "total_size")= num 2240 [15:31:48.362] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:48.362] - attr(*, "already-done")= logi TRUE [15:31:48.372] - copied '...future.FUN' to environment [15:31:48.372] - copied 'future.call.arguments' to environment [15:31:48.372] - copied '...future.elements_ii' to environment [15:31:48.373] - copied '...future.seeds_ii' to environment [15:31:48.373] - copied '...future.globals.maxSize' to environment [15:31:48.373] assign_globals() ... done [15:31:48.374] plan(): Setting new future strategy stack: [15:31:48.374] List of future strategies: [15:31:48.374] 1. sequential: [15:31:48.374] - args: function (..., envir = parent.frame(), workers = "") [15:31:48.374] - tweaked: FALSE [15:31:48.374] - call: NULL [15:31:48.375] plan(): nbrOfWorkers() = 1 [15:31:48.377] plan(): Setting new future strategy stack: [15:31:48.377] List of future strategies: [15:31:48.377] 1. multisession: [15:31:48.377] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:48.377] - tweaked: FALSE [15:31:48.377] - call: plan(strategy) [15:31:48.381] plan(): nbrOfWorkers() = 1 [15:31:48.382] SequentialFuture started (and completed) [15:31:48.382] - Launch lazy future ... done [15:31:48.382] run() for 'SequentialFuture' ... done [15:31:48.383] Created future: [15:31:48.383] SequentialFuture: [15:31:48.383] Label: 'future_lapply-4' [15:31:48.383] Expression: [15:31:48.383] { [15:31:48.383] do.call(function(...) { [15:31:48.383] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.383] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.383] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.383] on.exit(options(oopts), add = TRUE) [15:31:48.383] } [15:31:48.383] { [15:31:48.383] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.383] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.383] ...future.FUN(...future.X_jj, ...) [15:31:48.383] }) [15:31:48.383] } [15:31:48.383] }, args = future.call.arguments) [15:31:48.383] } [15:31:48.383] Lazy evaluation: FALSE [15:31:48.383] Asynchronous evaluation: FALSE [15:31:48.383] Local evaluation: TRUE [15:31:48.383] Environment: R_GlobalEnv [15:31:48.383] Capture standard output: TRUE [15:31:48.383] Capture condition classes: 'condition' (excluding 'nothing') [15:31:48.383] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:48.383] Packages: [15:31:48.383] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:48.383] Resolved: TRUE [15:31:48.383] Value: 0 bytes of class 'list' [15:31:48.383] Early signaling: FALSE [15:31:48.383] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:48.383] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.385] Chunk #4 of 4 ... DONE [15:31:48.386] Launching 4 futures (chunks) ... DONE [15:31:48.386] Resolving 4 futures (chunks) ... [15:31:48.386] resolve() on list ... [15:31:48.386] recursive: 0 [15:31:48.387] length: 4 [15:31:48.387] [15:31:48.387] resolved() for 'SequentialFuture' ... [15:31:48.387] - state: 'finished' [15:31:48.388] - run: TRUE [15:31:48.388] - result: 'FutureResult' [15:31:48.388] resolved() for 'SequentialFuture' ... done [15:31:48.389] Future #1 [15:31:48.389] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:48.389] - nx: 4 [15:31:48.390] - relay: TRUE [15:31:48.390] - stdout: TRUE [15:31:48.390] - signal: TRUE [15:31:48.390] - resignal: FALSE [15:31:48.391] - force: TRUE [15:31:48.391] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [15:31:48.391] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [15:31:48.391] - until=1 [15:31:48.392] - relaying element #1 [15:31:48.392] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:48.393] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:48.393] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:48.393] length: 3 (resolved future 1) [15:31:48.393] resolved() for 'SequentialFuture' ... [15:31:48.394] - state: 'finished' [15:31:48.394] - run: TRUE [15:31:48.394] - result: 'FutureResult' [15:31:48.395] resolved() for 'SequentialFuture' ... done [15:31:48.395] Future #2 [15:31:48.395] signalConditionsASAP(SequentialFuture, pos=2) ... [15:31:48.396] - nx: 4 [15:31:48.396] - relay: TRUE [15:31:48.396] - stdout: TRUE [15:31:48.397] - signal: TRUE [15:31:48.397] - resignal: FALSE [15:31:48.397] - force: TRUE [15:31:48.397] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:48.398] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:48.398] - until=2 [15:31:48.398] - relaying element #2 [15:31:48.399] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:48.399] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:48.399] signalConditionsASAP(SequentialFuture, pos=2) ... done [15:31:48.399] length: 2 (resolved future 2) [15:31:48.400] resolved() for 'SequentialFuture' ... [15:31:48.400] - state: 'finished' [15:31:48.400] - run: TRUE [15:31:48.401] - result: 'FutureResult' [15:31:48.401] resolved() for 'SequentialFuture' ... done [15:31:48.401] Future #3 [15:31:48.402] signalConditionsASAP(SequentialFuture, pos=3) ... [15:31:48.402] - nx: 4 [15:31:48.402] - relay: TRUE [15:31:48.402] - stdout: TRUE [15:31:48.403] - signal: TRUE [15:31:48.403] - resignal: FALSE [15:31:48.403] - force: TRUE [15:31:48.403] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:48.404] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:48.404] - until=3 [15:31:48.404] - relaying element #3 [15:31:48.405] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:48.405] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:48.405] signalConditionsASAP(SequentialFuture, pos=3) ... done [15:31:48.406] length: 1 (resolved future 3) [15:31:48.406] resolved() for 'SequentialFuture' ... [15:31:48.406] - state: 'finished' [15:31:48.406] - run: TRUE [15:31:48.407] - result: 'FutureResult' [15:31:48.407] resolved() for 'SequentialFuture' ... done [15:31:48.407] Future #4 [15:31:48.408] signalConditionsASAP(SequentialFuture, pos=4) ... [15:31:48.408] - nx: 4 [15:31:48.408] - relay: TRUE [15:31:48.408] - stdout: TRUE [15:31:48.409] - signal: TRUE [15:31:48.409] - resignal: FALSE [15:31:48.409] - force: TRUE [15:31:48.409] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:48.410] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:48.410] - until=4 [15:31:48.410] - relaying element #4 [15:31:48.411] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:48.411] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:48.411] signalConditionsASAP(SequentialFuture, pos=4) ... done [15:31:48.412] length: 0 (resolved future 4) [15:31:48.412] Relaying remaining futures [15:31:48.412] signalConditionsASAP(NULL, pos=0) ... [15:31:48.412] - nx: 4 [15:31:48.413] - relay: TRUE [15:31:48.413] - stdout: TRUE [15:31:48.413] - signal: TRUE [15:31:48.413] - resignal: FALSE [15:31:48.414] - force: TRUE [15:31:48.414] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:48.414] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [15:31:48.414] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:48.415] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:48.415] signalConditionsASAP(NULL, pos=0) ... done [15:31:48.415] resolve() on list ... DONE [15:31:48.416] - Number of value chunks collected: 4 [15:31:48.416] Resolving 4 futures (chunks) ... DONE [15:31:48.417] Reducing values from 4 chunks ... [15:31:48.417] - Number of values collected after concatenation: 4 [15:31:48.417] - Number of values expected: 4 [15:31:48.417] Reducing values from 4 chunks ... DONE [15:31:48.418] 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 [15:31:48.425] future_lapply() ... [15:31:48.430] Number of chunks: 4 [15:31:48.430] getGlobalsAndPackagesXApply() ... [15:31:48.430] - future.globals: TRUE [15:31:48.430] getGlobalsAndPackages() ... [15:31:48.431] Searching for globals... [15:31:48.433] - globals found: [2] 'FUN', '.Internal' [15:31:48.433] Searching for globals ... DONE [15:31:48.433] Resolving globals: FALSE [15:31:48.434] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:48.435] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:48.435] - globals: [1] 'FUN' [15:31:48.435] [15:31:48.436] getGlobalsAndPackages() ... DONE [15:31:48.436] - globals found/used: [n=1] 'FUN' [15:31:48.436] - needed namespaces: [n=0] [15:31:48.436] Finding globals ... DONE [15:31:48.437] - use_args: TRUE [15:31:48.437] - Getting '...' globals ... [15:31:48.438] resolve() on list ... [15:31:48.438] recursive: 0 [15:31:48.438] length: 1 [15:31:48.438] elements: '...' [15:31:48.439] length: 0 (resolved future 1) [15:31:48.439] resolve() on list ... DONE [15:31:48.439] - '...' content: [n=1] 'length' [15:31:48.439] List of 1 [15:31:48.439] $ ...:List of 1 [15:31:48.439] ..$ length: int 2 [15:31:48.439] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:48.439] - attr(*, "where")=List of 1 [15:31:48.439] ..$ ...: [15:31:48.439] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:48.439] - attr(*, "resolved")= logi TRUE [15:31:48.439] - attr(*, "total_size")= num NA [15:31:48.445] - Getting '...' globals ... DONE [15:31:48.445] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:48.445] List of 2 [15:31:48.445] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:48.445] $ ... :List of 1 [15:31:48.445] ..$ length: int 2 [15:31:48.445] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:48.445] - attr(*, "where")=List of 2 [15:31:48.445] ..$ ...future.FUN: [15:31:48.445] ..$ ... : [15:31:48.445] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:48.445] - attr(*, "resolved")= logi FALSE [15:31:48.445] - attr(*, "total_size")= num 2240 [15:31:48.451] Packages to be attached in all futures: [n=0] [15:31:48.452] getGlobalsAndPackagesXApply() ... DONE [15:31:48.452] Number of futures (= number of chunks): 4 [15:31:48.452] Launching 4 futures (chunks) ... [15:31:48.453] Chunk #1 of 4 ... [15:31:48.453] - Finding globals in 'X' for chunk #1 ... [15:31:48.453] getGlobalsAndPackages() ... [15:31:48.453] Searching for globals... [15:31:48.454] [15:31:48.454] Searching for globals ... DONE [15:31:48.455] - globals: [0] [15:31:48.455] getGlobalsAndPackages() ... DONE [15:31:48.455] + additional globals found: [n=0] [15:31:48.455] + additional namespaces needed: [n=0] [15:31:48.456] - Finding globals in 'X' for chunk #1 ... DONE [15:31:48.456] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:48.456] - seeds: [15:31:48.456] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.457] getGlobalsAndPackages() ... [15:31:48.457] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.457] Resolving globals: FALSE [15:31:48.458] Tweak future expression to call with '...' arguments ... [15:31:48.458] { [15:31:48.458] do.call(function(...) { [15:31:48.458] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.458] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.458] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.458] on.exit(options(oopts), add = TRUE) [15:31:48.458] } [15:31:48.458] { [15:31:48.458] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.458] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.458] ...future.FUN(...future.X_jj, ...) [15:31:48.458] }) [15:31:48.458] } [15:31:48.458] }, args = future.call.arguments) [15:31:48.458] } [15:31:48.459] Tweak future expression to call with '...' arguments ... DONE [15:31:48.459] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.460] [15:31:48.460] getGlobalsAndPackages() ... DONE [15:31:48.460] run() for 'Future' ... [15:31:48.461] - state: 'created' [15:31:48.461] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:48.465] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.465] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:48.466] - Field: 'label' [15:31:48.466] - Field: 'local' [15:31:48.466] - Field: 'owner' [15:31:48.467] - Field: 'envir' [15:31:48.467] - Field: 'packages' [15:31:48.467] - Field: 'gc' [15:31:48.468] - Field: 'conditions' [15:31:48.468] - Field: 'expr' [15:31:48.468] - Field: 'uuid' [15:31:48.468] - Field: 'seed' [15:31:48.469] - Field: 'version' [15:31:48.469] - Field: 'result' [15:31:48.469] - Field: 'asynchronous' [15:31:48.470] - Field: 'calls' [15:31:48.470] - Field: 'globals' [15:31:48.470] - Field: 'stdout' [15:31:48.470] - Field: 'earlySignal' [15:31:48.471] - Field: 'lazy' [15:31:48.471] - Field: 'state' [15:31:48.471] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:48.472] - Launch lazy future ... [15:31:48.472] Packages needed by the future expression (n = 0): [15:31:48.472] Packages needed by future strategies (n = 0): [15:31:48.473] { [15:31:48.473] { [15:31:48.473] { [15:31:48.473] ...future.startTime <- base::Sys.time() [15:31:48.473] { [15:31:48.473] { [15:31:48.473] { [15:31:48.473] base::local({ [15:31:48.473] has_future <- base::requireNamespace("future", [15:31:48.473] quietly = TRUE) [15:31:48.473] if (has_future) { [15:31:48.473] ns <- base::getNamespace("future") [15:31:48.473] version <- ns[[".package"]][["version"]] [15:31:48.473] if (is.null(version)) [15:31:48.473] version <- utils::packageVersion("future") [15:31:48.473] } [15:31:48.473] else { [15:31:48.473] version <- NULL [15:31:48.473] } [15:31:48.473] if (!has_future || version < "1.8.0") { [15:31:48.473] info <- base::c(r_version = base::gsub("R version ", [15:31:48.473] "", base::R.version$version.string), [15:31:48.473] platform = base::sprintf("%s (%s-bit)", [15:31:48.473] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:48.473] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:48.473] "release", "version")], collapse = " "), [15:31:48.473] hostname = base::Sys.info()[["nodename"]]) [15:31:48.473] info <- base::sprintf("%s: %s", base::names(info), [15:31:48.473] info) [15:31:48.473] info <- base::paste(info, collapse = "; ") [15:31:48.473] if (!has_future) { [15:31:48.473] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:48.473] info) [15:31:48.473] } [15:31:48.473] else { [15:31:48.473] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:48.473] info, version) [15:31:48.473] } [15:31:48.473] base::stop(msg) [15:31:48.473] } [15:31:48.473] }) [15:31:48.473] } [15:31:48.473] ...future.strategy.old <- future::plan("list") [15:31:48.473] options(future.plan = NULL) [15:31:48.473] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.473] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:48.473] } [15:31:48.473] ...future.workdir <- getwd() [15:31:48.473] } [15:31:48.473] ...future.oldOptions <- base::as.list(base::.Options) [15:31:48.473] ...future.oldEnvVars <- base::Sys.getenv() [15:31:48.473] } [15:31:48.473] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:48.473] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:48.473] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:48.473] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:48.473] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:48.473] future.stdout.windows.reencode = NULL, width = 80L) [15:31:48.473] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:48.473] base::names(...future.oldOptions)) [15:31:48.473] } [15:31:48.473] if (FALSE) { [15:31:48.473] } [15:31:48.473] else { [15:31:48.473] if (TRUE) { [15:31:48.473] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:48.473] open = "w") [15:31:48.473] } [15:31:48.473] else { [15:31:48.473] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:48.473] windows = "NUL", "/dev/null"), open = "w") [15:31:48.473] } [15:31:48.473] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:48.473] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:48.473] base::sink(type = "output", split = FALSE) [15:31:48.473] base::close(...future.stdout) [15:31:48.473] }, add = TRUE) [15:31:48.473] } [15:31:48.473] ...future.frame <- base::sys.nframe() [15:31:48.473] ...future.conditions <- base::list() [15:31:48.473] ...future.rng <- base::globalenv()$.Random.seed [15:31:48.473] if (FALSE) { [15:31:48.473] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:48.473] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:48.473] } [15:31:48.473] ...future.result <- base::tryCatch({ [15:31:48.473] base::withCallingHandlers({ [15:31:48.473] ...future.value <- base::withVisible(base::local({ [15:31:48.473] do.call(function(...) { [15:31:48.473] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.473] if (!identical(...future.globals.maxSize.org, [15:31:48.473] ...future.globals.maxSize)) { [15:31:48.473] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.473] on.exit(options(oopts), add = TRUE) [15:31:48.473] } [15:31:48.473] { [15:31:48.473] lapply(seq_along(...future.elements_ii), [15:31:48.473] FUN = function(jj) { [15:31:48.473] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.473] ...future.FUN(...future.X_jj, ...) [15:31:48.473] }) [15:31:48.473] } [15:31:48.473] }, args = future.call.arguments) [15:31:48.473] })) [15:31:48.473] future::FutureResult(value = ...future.value$value, [15:31:48.473] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.473] ...future.rng), globalenv = if (FALSE) [15:31:48.473] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:48.473] ...future.globalenv.names)) [15:31:48.473] else NULL, started = ...future.startTime, version = "1.8") [15:31:48.473] }, condition = base::local({ [15:31:48.473] c <- base::c [15:31:48.473] inherits <- base::inherits [15:31:48.473] invokeRestart <- base::invokeRestart [15:31:48.473] length <- base::length [15:31:48.473] list <- base::list [15:31:48.473] seq.int <- base::seq.int [15:31:48.473] signalCondition <- base::signalCondition [15:31:48.473] sys.calls <- base::sys.calls [15:31:48.473] `[[` <- base::`[[` [15:31:48.473] `+` <- base::`+` [15:31:48.473] `<<-` <- base::`<<-` [15:31:48.473] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:48.473] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:48.473] 3L)] [15:31:48.473] } [15:31:48.473] function(cond) { [15:31:48.473] is_error <- inherits(cond, "error") [15:31:48.473] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:48.473] NULL) [15:31:48.473] if (is_error) { [15:31:48.473] sessionInformation <- function() { [15:31:48.473] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:48.473] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:48.473] search = base::search(), system = base::Sys.info()) [15:31:48.473] } [15:31:48.473] ...future.conditions[[length(...future.conditions) + [15:31:48.473] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:48.473] cond$call), session = sessionInformation(), [15:31:48.473] timestamp = base::Sys.time(), signaled = 0L) [15:31:48.473] signalCondition(cond) [15:31:48.473] } [15:31:48.473] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:48.473] "immediateCondition"))) { [15:31:48.473] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:48.473] ...future.conditions[[length(...future.conditions) + [15:31:48.473] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:48.473] if (TRUE && !signal) { [15:31:48.473] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.473] { [15:31:48.473] inherits <- base::inherits [15:31:48.473] invokeRestart <- base::invokeRestart [15:31:48.473] is.null <- base::is.null [15:31:48.473] muffled <- FALSE [15:31:48.473] if (inherits(cond, "message")) { [15:31:48.473] muffled <- grepl(pattern, "muffleMessage") [15:31:48.473] if (muffled) [15:31:48.473] invokeRestart("muffleMessage") [15:31:48.473] } [15:31:48.473] else if (inherits(cond, "warning")) { [15:31:48.473] muffled <- grepl(pattern, "muffleWarning") [15:31:48.473] if (muffled) [15:31:48.473] invokeRestart("muffleWarning") [15:31:48.473] } [15:31:48.473] else if (inherits(cond, "condition")) { [15:31:48.473] if (!is.null(pattern)) { [15:31:48.473] computeRestarts <- base::computeRestarts [15:31:48.473] grepl <- base::grepl [15:31:48.473] restarts <- computeRestarts(cond) [15:31:48.473] for (restart in restarts) { [15:31:48.473] name <- restart$name [15:31:48.473] if (is.null(name)) [15:31:48.473] next [15:31:48.473] if (!grepl(pattern, name)) [15:31:48.473] next [15:31:48.473] invokeRestart(restart) [15:31:48.473] muffled <- TRUE [15:31:48.473] break [15:31:48.473] } [15:31:48.473] } [15:31:48.473] } [15:31:48.473] invisible(muffled) [15:31:48.473] } [15:31:48.473] muffleCondition(cond, pattern = "^muffle") [15:31:48.473] } [15:31:48.473] } [15:31:48.473] else { [15:31:48.473] if (TRUE) { [15:31:48.473] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.473] { [15:31:48.473] inherits <- base::inherits [15:31:48.473] invokeRestart <- base::invokeRestart [15:31:48.473] is.null <- base::is.null [15:31:48.473] muffled <- FALSE [15:31:48.473] if (inherits(cond, "message")) { [15:31:48.473] muffled <- grepl(pattern, "muffleMessage") [15:31:48.473] if (muffled) [15:31:48.473] invokeRestart("muffleMessage") [15:31:48.473] } [15:31:48.473] else if (inherits(cond, "warning")) { [15:31:48.473] muffled <- grepl(pattern, "muffleWarning") [15:31:48.473] if (muffled) [15:31:48.473] invokeRestart("muffleWarning") [15:31:48.473] } [15:31:48.473] else if (inherits(cond, "condition")) { [15:31:48.473] if (!is.null(pattern)) { [15:31:48.473] computeRestarts <- base::computeRestarts [15:31:48.473] grepl <- base::grepl [15:31:48.473] restarts <- computeRestarts(cond) [15:31:48.473] for (restart in restarts) { [15:31:48.473] name <- restart$name [15:31:48.473] if (is.null(name)) [15:31:48.473] next [15:31:48.473] if (!grepl(pattern, name)) [15:31:48.473] next [15:31:48.473] invokeRestart(restart) [15:31:48.473] muffled <- TRUE [15:31:48.473] break [15:31:48.473] } [15:31:48.473] } [15:31:48.473] } [15:31:48.473] invisible(muffled) [15:31:48.473] } [15:31:48.473] muffleCondition(cond, pattern = "^muffle") [15:31:48.473] } [15:31:48.473] } [15:31:48.473] } [15:31:48.473] })) [15:31:48.473] }, error = function(ex) { [15:31:48.473] base::structure(base::list(value = NULL, visible = NULL, [15:31:48.473] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.473] ...future.rng), started = ...future.startTime, [15:31:48.473] finished = Sys.time(), session_uuid = NA_character_, [15:31:48.473] version = "1.8"), class = "FutureResult") [15:31:48.473] }, finally = { [15:31:48.473] if (!identical(...future.workdir, getwd())) [15:31:48.473] setwd(...future.workdir) [15:31:48.473] { [15:31:48.473] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:48.473] ...future.oldOptions$nwarnings <- NULL [15:31:48.473] } [15:31:48.473] base::options(...future.oldOptions) [15:31:48.473] if (.Platform$OS.type == "windows") { [15:31:48.473] old_names <- names(...future.oldEnvVars) [15:31:48.473] envs <- base::Sys.getenv() [15:31:48.473] names <- names(envs) [15:31:48.473] common <- intersect(names, old_names) [15:31:48.473] added <- setdiff(names, old_names) [15:31:48.473] removed <- setdiff(old_names, names) [15:31:48.473] changed <- common[...future.oldEnvVars[common] != [15:31:48.473] envs[common]] [15:31:48.473] NAMES <- toupper(changed) [15:31:48.473] args <- list() [15:31:48.473] for (kk in seq_along(NAMES)) { [15:31:48.473] name <- changed[[kk]] [15:31:48.473] NAME <- NAMES[[kk]] [15:31:48.473] if (name != NAME && is.element(NAME, old_names)) [15:31:48.473] next [15:31:48.473] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.473] } [15:31:48.473] NAMES <- toupper(added) [15:31:48.473] for (kk in seq_along(NAMES)) { [15:31:48.473] name <- added[[kk]] [15:31:48.473] NAME <- NAMES[[kk]] [15:31:48.473] if (name != NAME && is.element(NAME, old_names)) [15:31:48.473] next [15:31:48.473] args[[name]] <- "" [15:31:48.473] } [15:31:48.473] NAMES <- toupper(removed) [15:31:48.473] for (kk in seq_along(NAMES)) { [15:31:48.473] name <- removed[[kk]] [15:31:48.473] NAME <- NAMES[[kk]] [15:31:48.473] if (name != NAME && is.element(NAME, old_names)) [15:31:48.473] next [15:31:48.473] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.473] } [15:31:48.473] if (length(args) > 0) [15:31:48.473] base::do.call(base::Sys.setenv, args = args) [15:31:48.473] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:48.473] } [15:31:48.473] else { [15:31:48.473] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:48.473] } [15:31:48.473] { [15:31:48.473] if (base::length(...future.futureOptionsAdded) > [15:31:48.473] 0L) { [15:31:48.473] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:48.473] base::names(opts) <- ...future.futureOptionsAdded [15:31:48.473] base::options(opts) [15:31:48.473] } [15:31:48.473] { [15:31:48.473] { [15:31:48.473] NULL [15:31:48.473] RNGkind("Mersenne-Twister") [15:31:48.473] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:48.473] inherits = FALSE) [15:31:48.473] } [15:31:48.473] options(future.plan = NULL) [15:31:48.473] if (is.na(NA_character_)) [15:31:48.473] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.473] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:48.473] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:48.473] .init = FALSE) [15:31:48.473] } [15:31:48.473] } [15:31:48.473] } [15:31:48.473] }) [15:31:48.473] if (TRUE) { [15:31:48.473] base::sink(type = "output", split = FALSE) [15:31:48.473] if (TRUE) { [15:31:48.473] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:48.473] } [15:31:48.473] else { [15:31:48.473] ...future.result["stdout"] <- base::list(NULL) [15:31:48.473] } [15:31:48.473] base::close(...future.stdout) [15:31:48.473] ...future.stdout <- NULL [15:31:48.473] } [15:31:48.473] ...future.result$conditions <- ...future.conditions [15:31:48.473] ...future.result$finished <- base::Sys.time() [15:31:48.473] ...future.result [15:31:48.473] } [15:31:48.480] assign_globals() ... [15:31:48.480] List of 5 [15:31:48.480] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:48.480] $ future.call.arguments :List of 1 [15:31:48.480] ..$ length: int 2 [15:31:48.480] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:48.480] $ ...future.elements_ii :List of 1 [15:31:48.480] ..$ a: chr "integer" [15:31:48.480] $ ...future.seeds_ii : NULL [15:31:48.480] $ ...future.globals.maxSize: NULL [15:31:48.480] - attr(*, "where")=List of 5 [15:31:48.480] ..$ ...future.FUN : [15:31:48.480] ..$ future.call.arguments : [15:31:48.480] ..$ ...future.elements_ii : [15:31:48.480] ..$ ...future.seeds_ii : [15:31:48.480] ..$ ...future.globals.maxSize: [15:31:48.480] - attr(*, "resolved")= logi FALSE [15:31:48.480] - attr(*, "total_size")= num 2240 [15:31:48.480] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:48.480] - attr(*, "already-done")= logi TRUE [15:31:48.490] - copied '...future.FUN' to environment [15:31:48.490] - copied 'future.call.arguments' to environment [15:31:48.490] - copied '...future.elements_ii' to environment [15:31:48.491] - copied '...future.seeds_ii' to environment [15:31:48.491] - copied '...future.globals.maxSize' to environment [15:31:48.491] assign_globals() ... done [15:31:48.492] plan(): Setting new future strategy stack: [15:31:48.492] List of future strategies: [15:31:48.492] 1. sequential: [15:31:48.492] - args: function (..., envir = parent.frame(), workers = "") [15:31:48.492] - tweaked: FALSE [15:31:48.492] - call: NULL [15:31:48.493] plan(): nbrOfWorkers() = 1 [15:31:48.495] plan(): Setting new future strategy stack: [15:31:48.495] List of future strategies: [15:31:48.495] 1. multisession: [15:31:48.495] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:48.495] - tweaked: FALSE [15:31:48.495] - call: plan(strategy) [15:31:48.499] plan(): nbrOfWorkers() = 1 [15:31:48.499] SequentialFuture started (and completed) [15:31:48.500] - Launch lazy future ... done [15:31:48.500] run() for 'SequentialFuture' ... done [15:31:48.501] Created future: [15:31:48.501] SequentialFuture: [15:31:48.501] Label: 'future_lapply-1' [15:31:48.501] Expression: [15:31:48.501] { [15:31:48.501] do.call(function(...) { [15:31:48.501] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.501] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.501] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.501] on.exit(options(oopts), add = TRUE) [15:31:48.501] } [15:31:48.501] { [15:31:48.501] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.501] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.501] ...future.FUN(...future.X_jj, ...) [15:31:48.501] }) [15:31:48.501] } [15:31:48.501] }, args = future.call.arguments) [15:31:48.501] } [15:31:48.501] Lazy evaluation: FALSE [15:31:48.501] Asynchronous evaluation: FALSE [15:31:48.501] Local evaluation: TRUE [15:31:48.501] Environment: R_GlobalEnv [15:31:48.501] Capture standard output: TRUE [15:31:48.501] Capture condition classes: 'condition' (excluding 'nothing') [15:31:48.501] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:48.501] Packages: [15:31:48.501] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:48.501] Resolved: TRUE [15:31:48.501] Value: 56 bytes of class 'list' [15:31:48.501] Early signaling: FALSE [15:31:48.501] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:48.501] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.503] Chunk #1 of 4 ... DONE [15:31:48.503] Chunk #2 of 4 ... [15:31:48.504] - Finding globals in 'X' for chunk #2 ... [15:31:48.504] getGlobalsAndPackages() ... [15:31:48.504] Searching for globals... [15:31:48.505] [15:31:48.505] Searching for globals ... DONE [15:31:48.505] - globals: [0] [15:31:48.505] getGlobalsAndPackages() ... DONE [15:31:48.506] + additional globals found: [n=0] [15:31:48.506] + additional namespaces needed: [n=0] [15:31:48.506] - Finding globals in 'X' for chunk #2 ... DONE [15:31:48.506] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:48.507] - seeds: [15:31:48.507] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.507] getGlobalsAndPackages() ... [15:31:48.508] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.508] Resolving globals: FALSE [15:31:48.508] Tweak future expression to call with '...' arguments ... [15:31:48.508] { [15:31:48.508] do.call(function(...) { [15:31:48.508] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.508] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.508] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.508] on.exit(options(oopts), add = TRUE) [15:31:48.508] } [15:31:48.508] { [15:31:48.508] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.508] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.508] ...future.FUN(...future.X_jj, ...) [15:31:48.508] }) [15:31:48.508] } [15:31:48.508] }, args = future.call.arguments) [15:31:48.508] } [15:31:48.509] Tweak future expression to call with '...' arguments ... DONE [15:31:48.510] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.510] [15:31:48.511] getGlobalsAndPackages() ... DONE [15:31:48.511] run() for 'Future' ... [15:31:48.511] - state: 'created' [15:31:48.512] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:48.516] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.516] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:48.517] - Field: 'label' [15:31:48.517] - Field: 'local' [15:31:48.517] - Field: 'owner' [15:31:48.518] - Field: 'envir' [15:31:48.518] - Field: 'packages' [15:31:48.518] - Field: 'gc' [15:31:48.518] - Field: 'conditions' [15:31:48.519] - Field: 'expr' [15:31:48.519] - Field: 'uuid' [15:31:48.519] - Field: 'seed' [15:31:48.520] - Field: 'version' [15:31:48.520] - Field: 'result' [15:31:48.520] - Field: 'asynchronous' [15:31:48.520] - Field: 'calls' [15:31:48.521] - Field: 'globals' [15:31:48.521] - Field: 'stdout' [15:31:48.521] - Field: 'earlySignal' [15:31:48.522] - Field: 'lazy' [15:31:48.522] - Field: 'state' [15:31:48.522] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:48.523] - Launch lazy future ... [15:31:48.523] Packages needed by the future expression (n = 0): [15:31:48.523] Packages needed by future strategies (n = 0): [15:31:48.524] { [15:31:48.524] { [15:31:48.524] { [15:31:48.524] ...future.startTime <- base::Sys.time() [15:31:48.524] { [15:31:48.524] { [15:31:48.524] { [15:31:48.524] base::local({ [15:31:48.524] has_future <- base::requireNamespace("future", [15:31:48.524] quietly = TRUE) [15:31:48.524] if (has_future) { [15:31:48.524] ns <- base::getNamespace("future") [15:31:48.524] version <- ns[[".package"]][["version"]] [15:31:48.524] if (is.null(version)) [15:31:48.524] version <- utils::packageVersion("future") [15:31:48.524] } [15:31:48.524] else { [15:31:48.524] version <- NULL [15:31:48.524] } [15:31:48.524] if (!has_future || version < "1.8.0") { [15:31:48.524] info <- base::c(r_version = base::gsub("R version ", [15:31:48.524] "", base::R.version$version.string), [15:31:48.524] platform = base::sprintf("%s (%s-bit)", [15:31:48.524] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:48.524] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:48.524] "release", "version")], collapse = " "), [15:31:48.524] hostname = base::Sys.info()[["nodename"]]) [15:31:48.524] info <- base::sprintf("%s: %s", base::names(info), [15:31:48.524] info) [15:31:48.524] info <- base::paste(info, collapse = "; ") [15:31:48.524] if (!has_future) { [15:31:48.524] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:48.524] info) [15:31:48.524] } [15:31:48.524] else { [15:31:48.524] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:48.524] info, version) [15:31:48.524] } [15:31:48.524] base::stop(msg) [15:31:48.524] } [15:31:48.524] }) [15:31:48.524] } [15:31:48.524] ...future.strategy.old <- future::plan("list") [15:31:48.524] options(future.plan = NULL) [15:31:48.524] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.524] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:48.524] } [15:31:48.524] ...future.workdir <- getwd() [15:31:48.524] } [15:31:48.524] ...future.oldOptions <- base::as.list(base::.Options) [15:31:48.524] ...future.oldEnvVars <- base::Sys.getenv() [15:31:48.524] } [15:31:48.524] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:48.524] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:48.524] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:48.524] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:48.524] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:48.524] future.stdout.windows.reencode = NULL, width = 80L) [15:31:48.524] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:48.524] base::names(...future.oldOptions)) [15:31:48.524] } [15:31:48.524] if (FALSE) { [15:31:48.524] } [15:31:48.524] else { [15:31:48.524] if (TRUE) { [15:31:48.524] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:48.524] open = "w") [15:31:48.524] } [15:31:48.524] else { [15:31:48.524] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:48.524] windows = "NUL", "/dev/null"), open = "w") [15:31:48.524] } [15:31:48.524] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:48.524] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:48.524] base::sink(type = "output", split = FALSE) [15:31:48.524] base::close(...future.stdout) [15:31:48.524] }, add = TRUE) [15:31:48.524] } [15:31:48.524] ...future.frame <- base::sys.nframe() [15:31:48.524] ...future.conditions <- base::list() [15:31:48.524] ...future.rng <- base::globalenv()$.Random.seed [15:31:48.524] if (FALSE) { [15:31:48.524] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:48.524] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:48.524] } [15:31:48.524] ...future.result <- base::tryCatch({ [15:31:48.524] base::withCallingHandlers({ [15:31:48.524] ...future.value <- base::withVisible(base::local({ [15:31:48.524] do.call(function(...) { [15:31:48.524] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.524] if (!identical(...future.globals.maxSize.org, [15:31:48.524] ...future.globals.maxSize)) { [15:31:48.524] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.524] on.exit(options(oopts), add = TRUE) [15:31:48.524] } [15:31:48.524] { [15:31:48.524] lapply(seq_along(...future.elements_ii), [15:31:48.524] FUN = function(jj) { [15:31:48.524] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.524] ...future.FUN(...future.X_jj, ...) [15:31:48.524] }) [15:31:48.524] } [15:31:48.524] }, args = future.call.arguments) [15:31:48.524] })) [15:31:48.524] future::FutureResult(value = ...future.value$value, [15:31:48.524] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.524] ...future.rng), globalenv = if (FALSE) [15:31:48.524] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:48.524] ...future.globalenv.names)) [15:31:48.524] else NULL, started = ...future.startTime, version = "1.8") [15:31:48.524] }, condition = base::local({ [15:31:48.524] c <- base::c [15:31:48.524] inherits <- base::inherits [15:31:48.524] invokeRestart <- base::invokeRestart [15:31:48.524] length <- base::length [15:31:48.524] list <- base::list [15:31:48.524] seq.int <- base::seq.int [15:31:48.524] signalCondition <- base::signalCondition [15:31:48.524] sys.calls <- base::sys.calls [15:31:48.524] `[[` <- base::`[[` [15:31:48.524] `+` <- base::`+` [15:31:48.524] `<<-` <- base::`<<-` [15:31:48.524] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:48.524] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:48.524] 3L)] [15:31:48.524] } [15:31:48.524] function(cond) { [15:31:48.524] is_error <- inherits(cond, "error") [15:31:48.524] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:48.524] NULL) [15:31:48.524] if (is_error) { [15:31:48.524] sessionInformation <- function() { [15:31:48.524] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:48.524] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:48.524] search = base::search(), system = base::Sys.info()) [15:31:48.524] } [15:31:48.524] ...future.conditions[[length(...future.conditions) + [15:31:48.524] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:48.524] cond$call), session = sessionInformation(), [15:31:48.524] timestamp = base::Sys.time(), signaled = 0L) [15:31:48.524] signalCondition(cond) [15:31:48.524] } [15:31:48.524] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:48.524] "immediateCondition"))) { [15:31:48.524] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:48.524] ...future.conditions[[length(...future.conditions) + [15:31:48.524] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:48.524] if (TRUE && !signal) { [15:31:48.524] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.524] { [15:31:48.524] inherits <- base::inherits [15:31:48.524] invokeRestart <- base::invokeRestart [15:31:48.524] is.null <- base::is.null [15:31:48.524] muffled <- FALSE [15:31:48.524] if (inherits(cond, "message")) { [15:31:48.524] muffled <- grepl(pattern, "muffleMessage") [15:31:48.524] if (muffled) [15:31:48.524] invokeRestart("muffleMessage") [15:31:48.524] } [15:31:48.524] else if (inherits(cond, "warning")) { [15:31:48.524] muffled <- grepl(pattern, "muffleWarning") [15:31:48.524] if (muffled) [15:31:48.524] invokeRestart("muffleWarning") [15:31:48.524] } [15:31:48.524] else if (inherits(cond, "condition")) { [15:31:48.524] if (!is.null(pattern)) { [15:31:48.524] computeRestarts <- base::computeRestarts [15:31:48.524] grepl <- base::grepl [15:31:48.524] restarts <- computeRestarts(cond) [15:31:48.524] for (restart in restarts) { [15:31:48.524] name <- restart$name [15:31:48.524] if (is.null(name)) [15:31:48.524] next [15:31:48.524] if (!grepl(pattern, name)) [15:31:48.524] next [15:31:48.524] invokeRestart(restart) [15:31:48.524] muffled <- TRUE [15:31:48.524] break [15:31:48.524] } [15:31:48.524] } [15:31:48.524] } [15:31:48.524] invisible(muffled) [15:31:48.524] } [15:31:48.524] muffleCondition(cond, pattern = "^muffle") [15:31:48.524] } [15:31:48.524] } [15:31:48.524] else { [15:31:48.524] if (TRUE) { [15:31:48.524] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.524] { [15:31:48.524] inherits <- base::inherits [15:31:48.524] invokeRestart <- base::invokeRestart [15:31:48.524] is.null <- base::is.null [15:31:48.524] muffled <- FALSE [15:31:48.524] if (inherits(cond, "message")) { [15:31:48.524] muffled <- grepl(pattern, "muffleMessage") [15:31:48.524] if (muffled) [15:31:48.524] invokeRestart("muffleMessage") [15:31:48.524] } [15:31:48.524] else if (inherits(cond, "warning")) { [15:31:48.524] muffled <- grepl(pattern, "muffleWarning") [15:31:48.524] if (muffled) [15:31:48.524] invokeRestart("muffleWarning") [15:31:48.524] } [15:31:48.524] else if (inherits(cond, "condition")) { [15:31:48.524] if (!is.null(pattern)) { [15:31:48.524] computeRestarts <- base::computeRestarts [15:31:48.524] grepl <- base::grepl [15:31:48.524] restarts <- computeRestarts(cond) [15:31:48.524] for (restart in restarts) { [15:31:48.524] name <- restart$name [15:31:48.524] if (is.null(name)) [15:31:48.524] next [15:31:48.524] if (!grepl(pattern, name)) [15:31:48.524] next [15:31:48.524] invokeRestart(restart) [15:31:48.524] muffled <- TRUE [15:31:48.524] break [15:31:48.524] } [15:31:48.524] } [15:31:48.524] } [15:31:48.524] invisible(muffled) [15:31:48.524] } [15:31:48.524] muffleCondition(cond, pattern = "^muffle") [15:31:48.524] } [15:31:48.524] } [15:31:48.524] } [15:31:48.524] })) [15:31:48.524] }, error = function(ex) { [15:31:48.524] base::structure(base::list(value = NULL, visible = NULL, [15:31:48.524] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.524] ...future.rng), started = ...future.startTime, [15:31:48.524] finished = Sys.time(), session_uuid = NA_character_, [15:31:48.524] version = "1.8"), class = "FutureResult") [15:31:48.524] }, finally = { [15:31:48.524] if (!identical(...future.workdir, getwd())) [15:31:48.524] setwd(...future.workdir) [15:31:48.524] { [15:31:48.524] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:48.524] ...future.oldOptions$nwarnings <- NULL [15:31:48.524] } [15:31:48.524] base::options(...future.oldOptions) [15:31:48.524] if (.Platform$OS.type == "windows") { [15:31:48.524] old_names <- names(...future.oldEnvVars) [15:31:48.524] envs <- base::Sys.getenv() [15:31:48.524] names <- names(envs) [15:31:48.524] common <- intersect(names, old_names) [15:31:48.524] added <- setdiff(names, old_names) [15:31:48.524] removed <- setdiff(old_names, names) [15:31:48.524] changed <- common[...future.oldEnvVars[common] != [15:31:48.524] envs[common]] [15:31:48.524] NAMES <- toupper(changed) [15:31:48.524] args <- list() [15:31:48.524] for (kk in seq_along(NAMES)) { [15:31:48.524] name <- changed[[kk]] [15:31:48.524] NAME <- NAMES[[kk]] [15:31:48.524] if (name != NAME && is.element(NAME, old_names)) [15:31:48.524] next [15:31:48.524] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.524] } [15:31:48.524] NAMES <- toupper(added) [15:31:48.524] for (kk in seq_along(NAMES)) { [15:31:48.524] name <- added[[kk]] [15:31:48.524] NAME <- NAMES[[kk]] [15:31:48.524] if (name != NAME && is.element(NAME, old_names)) [15:31:48.524] next [15:31:48.524] args[[name]] <- "" [15:31:48.524] } [15:31:48.524] NAMES <- toupper(removed) [15:31:48.524] for (kk in seq_along(NAMES)) { [15:31:48.524] name <- removed[[kk]] [15:31:48.524] NAME <- NAMES[[kk]] [15:31:48.524] if (name != NAME && is.element(NAME, old_names)) [15:31:48.524] next [15:31:48.524] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.524] } [15:31:48.524] if (length(args) > 0) [15:31:48.524] base::do.call(base::Sys.setenv, args = args) [15:31:48.524] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:48.524] } [15:31:48.524] else { [15:31:48.524] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:48.524] } [15:31:48.524] { [15:31:48.524] if (base::length(...future.futureOptionsAdded) > [15:31:48.524] 0L) { [15:31:48.524] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:48.524] base::names(opts) <- ...future.futureOptionsAdded [15:31:48.524] base::options(opts) [15:31:48.524] } [15:31:48.524] { [15:31:48.524] { [15:31:48.524] NULL [15:31:48.524] RNGkind("Mersenne-Twister") [15:31:48.524] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:48.524] inherits = FALSE) [15:31:48.524] } [15:31:48.524] options(future.plan = NULL) [15:31:48.524] if (is.na(NA_character_)) [15:31:48.524] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.524] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:48.524] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:48.524] .init = FALSE) [15:31:48.524] } [15:31:48.524] } [15:31:48.524] } [15:31:48.524] }) [15:31:48.524] if (TRUE) { [15:31:48.524] base::sink(type = "output", split = FALSE) [15:31:48.524] if (TRUE) { [15:31:48.524] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:48.524] } [15:31:48.524] else { [15:31:48.524] ...future.result["stdout"] <- base::list(NULL) [15:31:48.524] } [15:31:48.524] base::close(...future.stdout) [15:31:48.524] ...future.stdout <- NULL [15:31:48.524] } [15:31:48.524] ...future.result$conditions <- ...future.conditions [15:31:48.524] ...future.result$finished <- base::Sys.time() [15:31:48.524] ...future.result [15:31:48.524] } [15:31:48.531] assign_globals() ... [15:31:48.531] List of 5 [15:31:48.531] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:48.531] $ future.call.arguments :List of 1 [15:31:48.531] ..$ length: int 2 [15:31:48.531] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:48.531] $ ...future.elements_ii :List of 1 [15:31:48.531] ..$ b: chr "numeric" [15:31:48.531] $ ...future.seeds_ii : NULL [15:31:48.531] $ ...future.globals.maxSize: NULL [15:31:48.531] - attr(*, "where")=List of 5 [15:31:48.531] ..$ ...future.FUN : [15:31:48.531] ..$ future.call.arguments : [15:31:48.531] ..$ ...future.elements_ii : [15:31:48.531] ..$ ...future.seeds_ii : [15:31:48.531] ..$ ...future.globals.maxSize: [15:31:48.531] - attr(*, "resolved")= logi FALSE [15:31:48.531] - attr(*, "total_size")= num 2240 [15:31:48.531] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:48.531] - attr(*, "already-done")= logi TRUE [15:31:48.541] - copied '...future.FUN' to environment [15:31:48.541] - copied 'future.call.arguments' to environment [15:31:48.541] - copied '...future.elements_ii' to environment [15:31:48.541] - copied '...future.seeds_ii' to environment [15:31:48.542] - copied '...future.globals.maxSize' to environment [15:31:48.542] assign_globals() ... done [15:31:48.543] plan(): Setting new future strategy stack: [15:31:48.543] List of future strategies: [15:31:48.543] 1. sequential: [15:31:48.543] - args: function (..., envir = parent.frame(), workers = "") [15:31:48.543] - tweaked: FALSE [15:31:48.543] - call: NULL [15:31:48.544] plan(): nbrOfWorkers() = 1 [15:31:48.546] plan(): Setting new future strategy stack: [15:31:48.546] List of future strategies: [15:31:48.546] 1. multisession: [15:31:48.546] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:48.546] - tweaked: FALSE [15:31:48.546] - call: plan(strategy) [15:31:48.550] plan(): nbrOfWorkers() = 1 [15:31:48.550] SequentialFuture started (and completed) [15:31:48.551] - Launch lazy future ... done [15:31:48.551] run() for 'SequentialFuture' ... done [15:31:48.551] Created future: [15:31:48.551] SequentialFuture: [15:31:48.551] Label: 'future_lapply-2' [15:31:48.551] Expression: [15:31:48.551] { [15:31:48.551] do.call(function(...) { [15:31:48.551] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.551] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.551] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.551] on.exit(options(oopts), add = TRUE) [15:31:48.551] } [15:31:48.551] { [15:31:48.551] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.551] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.551] ...future.FUN(...future.X_jj, ...) [15:31:48.551] }) [15:31:48.551] } [15:31:48.551] }, args = future.call.arguments) [15:31:48.551] } [15:31:48.551] Lazy evaluation: FALSE [15:31:48.551] Asynchronous evaluation: FALSE [15:31:48.551] Local evaluation: TRUE [15:31:48.551] Environment: R_GlobalEnv [15:31:48.551] Capture standard output: TRUE [15:31:48.551] Capture condition classes: 'condition' (excluding 'nothing') [15:31:48.551] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:48.551] Packages: [15:31:48.551] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:48.551] Resolved: TRUE [15:31:48.551] Value: 64 bytes of class 'list' [15:31:48.551] Early signaling: FALSE [15:31:48.551] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:48.551] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.553] Chunk #2 of 4 ... DONE [15:31:48.554] Chunk #3 of 4 ... [15:31:48.554] - Finding globals in 'X' for chunk #3 ... [15:31:48.554] getGlobalsAndPackages() ... [15:31:48.555] Searching for globals... [15:31:48.555] [15:31:48.555] Searching for globals ... DONE [15:31:48.556] - globals: [0] [15:31:48.556] getGlobalsAndPackages() ... DONE [15:31:48.556] + additional globals found: [n=0] [15:31:48.556] + additional namespaces needed: [n=0] [15:31:48.557] - Finding globals in 'X' for chunk #3 ... DONE [15:31:48.557] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:48.557] - seeds: [15:31:48.557] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.558] getGlobalsAndPackages() ... [15:31:48.558] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.558] Resolving globals: FALSE [15:31:48.559] Tweak future expression to call with '...' arguments ... [15:31:48.559] { [15:31:48.559] do.call(function(...) { [15:31:48.559] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.559] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.559] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.559] on.exit(options(oopts), add = TRUE) [15:31:48.559] } [15:31:48.559] { [15:31:48.559] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.559] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.559] ...future.FUN(...future.X_jj, ...) [15:31:48.559] }) [15:31:48.559] } [15:31:48.559] }, args = future.call.arguments) [15:31:48.559] } [15:31:48.560] Tweak future expression to call with '...' arguments ... DONE [15:31:48.560] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.561] [15:31:48.561] getGlobalsAndPackages() ... DONE [15:31:48.562] run() for 'Future' ... [15:31:48.562] - state: 'created' [15:31:48.562] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:48.566] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.566] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:48.567] - Field: 'label' [15:31:48.567] - Field: 'local' [15:31:48.567] - Field: 'owner' [15:31:48.568] - Field: 'envir' [15:31:48.568] - Field: 'packages' [15:31:48.568] - Field: 'gc' [15:31:48.568] - Field: 'conditions' [15:31:48.569] - Field: 'expr' [15:31:48.569] - Field: 'uuid' [15:31:48.569] - Field: 'seed' [15:31:48.570] - Field: 'version' [15:31:48.570] - Field: 'result' [15:31:48.570] - Field: 'asynchronous' [15:31:48.571] - Field: 'calls' [15:31:48.571] - Field: 'globals' [15:31:48.571] - Field: 'stdout' [15:31:48.572] - Field: 'earlySignal' [15:31:48.572] - Field: 'lazy' [15:31:48.572] - Field: 'state' [15:31:48.572] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:48.573] - Launch lazy future ... [15:31:48.573] Packages needed by the future expression (n = 0): [15:31:48.573] Packages needed by future strategies (n = 0): [15:31:48.574] { [15:31:48.574] { [15:31:48.574] { [15:31:48.574] ...future.startTime <- base::Sys.time() [15:31:48.574] { [15:31:48.574] { [15:31:48.574] { [15:31:48.574] base::local({ [15:31:48.574] has_future <- base::requireNamespace("future", [15:31:48.574] quietly = TRUE) [15:31:48.574] if (has_future) { [15:31:48.574] ns <- base::getNamespace("future") [15:31:48.574] version <- ns[[".package"]][["version"]] [15:31:48.574] if (is.null(version)) [15:31:48.574] version <- utils::packageVersion("future") [15:31:48.574] } [15:31:48.574] else { [15:31:48.574] version <- NULL [15:31:48.574] } [15:31:48.574] if (!has_future || version < "1.8.0") { [15:31:48.574] info <- base::c(r_version = base::gsub("R version ", [15:31:48.574] "", base::R.version$version.string), [15:31:48.574] platform = base::sprintf("%s (%s-bit)", [15:31:48.574] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:48.574] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:48.574] "release", "version")], collapse = " "), [15:31:48.574] hostname = base::Sys.info()[["nodename"]]) [15:31:48.574] info <- base::sprintf("%s: %s", base::names(info), [15:31:48.574] info) [15:31:48.574] info <- base::paste(info, collapse = "; ") [15:31:48.574] if (!has_future) { [15:31:48.574] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:48.574] info) [15:31:48.574] } [15:31:48.574] else { [15:31:48.574] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:48.574] info, version) [15:31:48.574] } [15:31:48.574] base::stop(msg) [15:31:48.574] } [15:31:48.574] }) [15:31:48.574] } [15:31:48.574] ...future.strategy.old <- future::plan("list") [15:31:48.574] options(future.plan = NULL) [15:31:48.574] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.574] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:48.574] } [15:31:48.574] ...future.workdir <- getwd() [15:31:48.574] } [15:31:48.574] ...future.oldOptions <- base::as.list(base::.Options) [15:31:48.574] ...future.oldEnvVars <- base::Sys.getenv() [15:31:48.574] } [15:31:48.574] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:48.574] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:48.574] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:48.574] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:48.574] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:48.574] future.stdout.windows.reencode = NULL, width = 80L) [15:31:48.574] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:48.574] base::names(...future.oldOptions)) [15:31:48.574] } [15:31:48.574] if (FALSE) { [15:31:48.574] } [15:31:48.574] else { [15:31:48.574] if (TRUE) { [15:31:48.574] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:48.574] open = "w") [15:31:48.574] } [15:31:48.574] else { [15:31:48.574] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:48.574] windows = "NUL", "/dev/null"), open = "w") [15:31:48.574] } [15:31:48.574] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:48.574] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:48.574] base::sink(type = "output", split = FALSE) [15:31:48.574] base::close(...future.stdout) [15:31:48.574] }, add = TRUE) [15:31:48.574] } [15:31:48.574] ...future.frame <- base::sys.nframe() [15:31:48.574] ...future.conditions <- base::list() [15:31:48.574] ...future.rng <- base::globalenv()$.Random.seed [15:31:48.574] if (FALSE) { [15:31:48.574] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:48.574] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:48.574] } [15:31:48.574] ...future.result <- base::tryCatch({ [15:31:48.574] base::withCallingHandlers({ [15:31:48.574] ...future.value <- base::withVisible(base::local({ [15:31:48.574] do.call(function(...) { [15:31:48.574] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.574] if (!identical(...future.globals.maxSize.org, [15:31:48.574] ...future.globals.maxSize)) { [15:31:48.574] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.574] on.exit(options(oopts), add = TRUE) [15:31:48.574] } [15:31:48.574] { [15:31:48.574] lapply(seq_along(...future.elements_ii), [15:31:48.574] FUN = function(jj) { [15:31:48.574] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.574] ...future.FUN(...future.X_jj, ...) [15:31:48.574] }) [15:31:48.574] } [15:31:48.574] }, args = future.call.arguments) [15:31:48.574] })) [15:31:48.574] future::FutureResult(value = ...future.value$value, [15:31:48.574] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.574] ...future.rng), globalenv = if (FALSE) [15:31:48.574] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:48.574] ...future.globalenv.names)) [15:31:48.574] else NULL, started = ...future.startTime, version = "1.8") [15:31:48.574] }, condition = base::local({ [15:31:48.574] c <- base::c [15:31:48.574] inherits <- base::inherits [15:31:48.574] invokeRestart <- base::invokeRestart [15:31:48.574] length <- base::length [15:31:48.574] list <- base::list [15:31:48.574] seq.int <- base::seq.int [15:31:48.574] signalCondition <- base::signalCondition [15:31:48.574] sys.calls <- base::sys.calls [15:31:48.574] `[[` <- base::`[[` [15:31:48.574] `+` <- base::`+` [15:31:48.574] `<<-` <- base::`<<-` [15:31:48.574] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:48.574] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:48.574] 3L)] [15:31:48.574] } [15:31:48.574] function(cond) { [15:31:48.574] is_error <- inherits(cond, "error") [15:31:48.574] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:48.574] NULL) [15:31:48.574] if (is_error) { [15:31:48.574] sessionInformation <- function() { [15:31:48.574] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:48.574] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:48.574] search = base::search(), system = base::Sys.info()) [15:31:48.574] } [15:31:48.574] ...future.conditions[[length(...future.conditions) + [15:31:48.574] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:48.574] cond$call), session = sessionInformation(), [15:31:48.574] timestamp = base::Sys.time(), signaled = 0L) [15:31:48.574] signalCondition(cond) [15:31:48.574] } [15:31:48.574] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:48.574] "immediateCondition"))) { [15:31:48.574] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:48.574] ...future.conditions[[length(...future.conditions) + [15:31:48.574] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:48.574] if (TRUE && !signal) { [15:31:48.574] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.574] { [15:31:48.574] inherits <- base::inherits [15:31:48.574] invokeRestart <- base::invokeRestart [15:31:48.574] is.null <- base::is.null [15:31:48.574] muffled <- FALSE [15:31:48.574] if (inherits(cond, "message")) { [15:31:48.574] muffled <- grepl(pattern, "muffleMessage") [15:31:48.574] if (muffled) [15:31:48.574] invokeRestart("muffleMessage") [15:31:48.574] } [15:31:48.574] else if (inherits(cond, "warning")) { [15:31:48.574] muffled <- grepl(pattern, "muffleWarning") [15:31:48.574] if (muffled) [15:31:48.574] invokeRestart("muffleWarning") [15:31:48.574] } [15:31:48.574] else if (inherits(cond, "condition")) { [15:31:48.574] if (!is.null(pattern)) { [15:31:48.574] computeRestarts <- base::computeRestarts [15:31:48.574] grepl <- base::grepl [15:31:48.574] restarts <- computeRestarts(cond) [15:31:48.574] for (restart in restarts) { [15:31:48.574] name <- restart$name [15:31:48.574] if (is.null(name)) [15:31:48.574] next [15:31:48.574] if (!grepl(pattern, name)) [15:31:48.574] next [15:31:48.574] invokeRestart(restart) [15:31:48.574] muffled <- TRUE [15:31:48.574] break [15:31:48.574] } [15:31:48.574] } [15:31:48.574] } [15:31:48.574] invisible(muffled) [15:31:48.574] } [15:31:48.574] muffleCondition(cond, pattern = "^muffle") [15:31:48.574] } [15:31:48.574] } [15:31:48.574] else { [15:31:48.574] if (TRUE) { [15:31:48.574] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.574] { [15:31:48.574] inherits <- base::inherits [15:31:48.574] invokeRestart <- base::invokeRestart [15:31:48.574] is.null <- base::is.null [15:31:48.574] muffled <- FALSE [15:31:48.574] if (inherits(cond, "message")) { [15:31:48.574] muffled <- grepl(pattern, "muffleMessage") [15:31:48.574] if (muffled) [15:31:48.574] invokeRestart("muffleMessage") [15:31:48.574] } [15:31:48.574] else if (inherits(cond, "warning")) { [15:31:48.574] muffled <- grepl(pattern, "muffleWarning") [15:31:48.574] if (muffled) [15:31:48.574] invokeRestart("muffleWarning") [15:31:48.574] } [15:31:48.574] else if (inherits(cond, "condition")) { [15:31:48.574] if (!is.null(pattern)) { [15:31:48.574] computeRestarts <- base::computeRestarts [15:31:48.574] grepl <- base::grepl [15:31:48.574] restarts <- computeRestarts(cond) [15:31:48.574] for (restart in restarts) { [15:31:48.574] name <- restart$name [15:31:48.574] if (is.null(name)) [15:31:48.574] next [15:31:48.574] if (!grepl(pattern, name)) [15:31:48.574] next [15:31:48.574] invokeRestart(restart) [15:31:48.574] muffled <- TRUE [15:31:48.574] break [15:31:48.574] } [15:31:48.574] } [15:31:48.574] } [15:31:48.574] invisible(muffled) [15:31:48.574] } [15:31:48.574] muffleCondition(cond, pattern = "^muffle") [15:31:48.574] } [15:31:48.574] } [15:31:48.574] } [15:31:48.574] })) [15:31:48.574] }, error = function(ex) { [15:31:48.574] base::structure(base::list(value = NULL, visible = NULL, [15:31:48.574] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.574] ...future.rng), started = ...future.startTime, [15:31:48.574] finished = Sys.time(), session_uuid = NA_character_, [15:31:48.574] version = "1.8"), class = "FutureResult") [15:31:48.574] }, finally = { [15:31:48.574] if (!identical(...future.workdir, getwd())) [15:31:48.574] setwd(...future.workdir) [15:31:48.574] { [15:31:48.574] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:48.574] ...future.oldOptions$nwarnings <- NULL [15:31:48.574] } [15:31:48.574] base::options(...future.oldOptions) [15:31:48.574] if (.Platform$OS.type == "windows") { [15:31:48.574] old_names <- names(...future.oldEnvVars) [15:31:48.574] envs <- base::Sys.getenv() [15:31:48.574] names <- names(envs) [15:31:48.574] common <- intersect(names, old_names) [15:31:48.574] added <- setdiff(names, old_names) [15:31:48.574] removed <- setdiff(old_names, names) [15:31:48.574] changed <- common[...future.oldEnvVars[common] != [15:31:48.574] envs[common]] [15:31:48.574] NAMES <- toupper(changed) [15:31:48.574] args <- list() [15:31:48.574] for (kk in seq_along(NAMES)) { [15:31:48.574] name <- changed[[kk]] [15:31:48.574] NAME <- NAMES[[kk]] [15:31:48.574] if (name != NAME && is.element(NAME, old_names)) [15:31:48.574] next [15:31:48.574] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.574] } [15:31:48.574] NAMES <- toupper(added) [15:31:48.574] for (kk in seq_along(NAMES)) { [15:31:48.574] name <- added[[kk]] [15:31:48.574] NAME <- NAMES[[kk]] [15:31:48.574] if (name != NAME && is.element(NAME, old_names)) [15:31:48.574] next [15:31:48.574] args[[name]] <- "" [15:31:48.574] } [15:31:48.574] NAMES <- toupper(removed) [15:31:48.574] for (kk in seq_along(NAMES)) { [15:31:48.574] name <- removed[[kk]] [15:31:48.574] NAME <- NAMES[[kk]] [15:31:48.574] if (name != NAME && is.element(NAME, old_names)) [15:31:48.574] next [15:31:48.574] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.574] } [15:31:48.574] if (length(args) > 0) [15:31:48.574] base::do.call(base::Sys.setenv, args = args) [15:31:48.574] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:48.574] } [15:31:48.574] else { [15:31:48.574] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:48.574] } [15:31:48.574] { [15:31:48.574] if (base::length(...future.futureOptionsAdded) > [15:31:48.574] 0L) { [15:31:48.574] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:48.574] base::names(opts) <- ...future.futureOptionsAdded [15:31:48.574] base::options(opts) [15:31:48.574] } [15:31:48.574] { [15:31:48.574] { [15:31:48.574] NULL [15:31:48.574] RNGkind("Mersenne-Twister") [15:31:48.574] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:48.574] inherits = FALSE) [15:31:48.574] } [15:31:48.574] options(future.plan = NULL) [15:31:48.574] if (is.na(NA_character_)) [15:31:48.574] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.574] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:48.574] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:48.574] .init = FALSE) [15:31:48.574] } [15:31:48.574] } [15:31:48.574] } [15:31:48.574] }) [15:31:48.574] if (TRUE) { [15:31:48.574] base::sink(type = "output", split = FALSE) [15:31:48.574] if (TRUE) { [15:31:48.574] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:48.574] } [15:31:48.574] else { [15:31:48.574] ...future.result["stdout"] <- base::list(NULL) [15:31:48.574] } [15:31:48.574] base::close(...future.stdout) [15:31:48.574] ...future.stdout <- NULL [15:31:48.574] } [15:31:48.574] ...future.result$conditions <- ...future.conditions [15:31:48.574] ...future.result$finished <- base::Sys.time() [15:31:48.574] ...future.result [15:31:48.574] } [15:31:48.580] assign_globals() ... [15:31:48.580] List of 5 [15:31:48.580] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:48.580] $ future.call.arguments :List of 1 [15:31:48.580] ..$ length: int 2 [15:31:48.580] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:48.580] $ ...future.elements_ii :List of 1 [15:31:48.580] ..$ c: chr "character" [15:31:48.580] $ ...future.seeds_ii : NULL [15:31:48.580] $ ...future.globals.maxSize: NULL [15:31:48.580] - attr(*, "where")=List of 5 [15:31:48.580] ..$ ...future.FUN : [15:31:48.580] ..$ future.call.arguments : [15:31:48.580] ..$ ...future.elements_ii : [15:31:48.580] ..$ ...future.seeds_ii : [15:31:48.580] ..$ ...future.globals.maxSize: [15:31:48.580] - attr(*, "resolved")= logi FALSE [15:31:48.580] - attr(*, "total_size")= num 2240 [15:31:48.580] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:48.580] - attr(*, "already-done")= logi TRUE [15:31:48.590] - copied '...future.FUN' to environment [15:31:48.590] - copied 'future.call.arguments' to environment [15:31:48.591] - copied '...future.elements_ii' to environment [15:31:48.591] - copied '...future.seeds_ii' to environment [15:31:48.591] - copied '...future.globals.maxSize' to environment [15:31:48.591] assign_globals() ... done [15:31:48.592] plan(): Setting new future strategy stack: [15:31:48.592] List of future strategies: [15:31:48.592] 1. sequential: [15:31:48.592] - args: function (..., envir = parent.frame(), workers = "") [15:31:48.592] - tweaked: FALSE [15:31:48.592] - call: NULL [15:31:48.593] plan(): nbrOfWorkers() = 1 [15:31:48.595] plan(): Setting new future strategy stack: [15:31:48.595] List of future strategies: [15:31:48.595] 1. multisession: [15:31:48.595] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:48.595] - tweaked: FALSE [15:31:48.595] - call: plan(strategy) [15:31:48.599] plan(): nbrOfWorkers() = 1 [15:31:48.599] SequentialFuture started (and completed) [15:31:48.600] - Launch lazy future ... done [15:31:48.600] run() for 'SequentialFuture' ... done [15:31:48.600] Created future: [15:31:48.601] SequentialFuture: [15:31:48.601] Label: 'future_lapply-3' [15:31:48.601] Expression: [15:31:48.601] { [15:31:48.601] do.call(function(...) { [15:31:48.601] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.601] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.601] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.601] on.exit(options(oopts), add = TRUE) [15:31:48.601] } [15:31:48.601] { [15:31:48.601] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.601] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.601] ...future.FUN(...future.X_jj, ...) [15:31:48.601] }) [15:31:48.601] } [15:31:48.601] }, args = future.call.arguments) [15:31:48.601] } [15:31:48.601] Lazy evaluation: FALSE [15:31:48.601] Asynchronous evaluation: FALSE [15:31:48.601] Local evaluation: TRUE [15:31:48.601] Environment: R_GlobalEnv [15:31:48.601] Capture standard output: TRUE [15:31:48.601] Capture condition classes: 'condition' (excluding 'nothing') [15:31:48.601] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 120 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:48.601] Packages: [15:31:48.601] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:48.601] Resolved: TRUE [15:31:48.601] Value: 120 bytes of class 'list' [15:31:48.601] Early signaling: FALSE [15:31:48.601] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:48.601] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.603] Chunk #3 of 4 ... DONE [15:31:48.603] Chunk #4 of 4 ... [15:31:48.603] - Finding globals in 'X' for chunk #4 ... [15:31:48.604] getGlobalsAndPackages() ... [15:31:48.604] Searching for globals... [15:31:48.604] [15:31:48.605] Searching for globals ... DONE [15:31:48.605] - globals: [0] [15:31:48.605] getGlobalsAndPackages() ... DONE [15:31:48.605] + additional globals found: [n=0] [15:31:48.606] + additional namespaces needed: [n=0] [15:31:48.606] - Finding globals in 'X' for chunk #4 ... DONE [15:31:48.606] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:48.606] - seeds: [15:31:48.607] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.607] getGlobalsAndPackages() ... [15:31:48.607] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.607] Resolving globals: FALSE [15:31:48.608] Tweak future expression to call with '...' arguments ... [15:31:48.608] { [15:31:48.608] do.call(function(...) { [15:31:48.608] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.608] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.608] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.608] on.exit(options(oopts), add = TRUE) [15:31:48.608] } [15:31:48.608] { [15:31:48.608] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.608] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.608] ...future.FUN(...future.X_jj, ...) [15:31:48.608] }) [15:31:48.608] } [15:31:48.608] }, args = future.call.arguments) [15:31:48.608] } [15:31:48.609] Tweak future expression to call with '...' arguments ... DONE [15:31:48.609] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.610] [15:31:48.610] getGlobalsAndPackages() ... DONE [15:31:48.611] run() for 'Future' ... [15:31:48.611] - state: 'created' [15:31:48.611] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:48.615] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.616] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:48.616] - Field: 'label' [15:31:48.616] - Field: 'local' [15:31:48.616] - Field: 'owner' [15:31:48.617] - Field: 'envir' [15:31:48.617] - Field: 'packages' [15:31:48.617] - Field: 'gc' [15:31:48.618] - Field: 'conditions' [15:31:48.621] - Field: 'expr' [15:31:48.621] - Field: 'uuid' [15:31:48.622] - Field: 'seed' [15:31:48.622] - Field: 'version' [15:31:48.622] - Field: 'result' [15:31:48.622] - Field: 'asynchronous' [15:31:48.623] - Field: 'calls' [15:31:48.623] - Field: 'globals' [15:31:48.623] - Field: 'stdout' [15:31:48.623] - Field: 'earlySignal' [15:31:48.624] - Field: 'lazy' [15:31:48.624] - Field: 'state' [15:31:48.624] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:48.625] - Launch lazy future ... [15:31:48.625] Packages needed by the future expression (n = 0): [15:31:48.625] Packages needed by future strategies (n = 0): [15:31:48.626] { [15:31:48.626] { [15:31:48.626] { [15:31:48.626] ...future.startTime <- base::Sys.time() [15:31:48.626] { [15:31:48.626] { [15:31:48.626] { [15:31:48.626] base::local({ [15:31:48.626] has_future <- base::requireNamespace("future", [15:31:48.626] quietly = TRUE) [15:31:48.626] if (has_future) { [15:31:48.626] ns <- base::getNamespace("future") [15:31:48.626] version <- ns[[".package"]][["version"]] [15:31:48.626] if (is.null(version)) [15:31:48.626] version <- utils::packageVersion("future") [15:31:48.626] } [15:31:48.626] else { [15:31:48.626] version <- NULL [15:31:48.626] } [15:31:48.626] if (!has_future || version < "1.8.0") { [15:31:48.626] info <- base::c(r_version = base::gsub("R version ", [15:31:48.626] "", base::R.version$version.string), [15:31:48.626] platform = base::sprintf("%s (%s-bit)", [15:31:48.626] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:48.626] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:48.626] "release", "version")], collapse = " "), [15:31:48.626] hostname = base::Sys.info()[["nodename"]]) [15:31:48.626] info <- base::sprintf("%s: %s", base::names(info), [15:31:48.626] info) [15:31:48.626] info <- base::paste(info, collapse = "; ") [15:31:48.626] if (!has_future) { [15:31:48.626] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:48.626] info) [15:31:48.626] } [15:31:48.626] else { [15:31:48.626] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:48.626] info, version) [15:31:48.626] } [15:31:48.626] base::stop(msg) [15:31:48.626] } [15:31:48.626] }) [15:31:48.626] } [15:31:48.626] ...future.strategy.old <- future::plan("list") [15:31:48.626] options(future.plan = NULL) [15:31:48.626] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.626] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:48.626] } [15:31:48.626] ...future.workdir <- getwd() [15:31:48.626] } [15:31:48.626] ...future.oldOptions <- base::as.list(base::.Options) [15:31:48.626] ...future.oldEnvVars <- base::Sys.getenv() [15:31:48.626] } [15:31:48.626] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:48.626] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:48.626] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:48.626] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:48.626] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:48.626] future.stdout.windows.reencode = NULL, width = 80L) [15:31:48.626] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:48.626] base::names(...future.oldOptions)) [15:31:48.626] } [15:31:48.626] if (FALSE) { [15:31:48.626] } [15:31:48.626] else { [15:31:48.626] if (TRUE) { [15:31:48.626] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:48.626] open = "w") [15:31:48.626] } [15:31:48.626] else { [15:31:48.626] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:48.626] windows = "NUL", "/dev/null"), open = "w") [15:31:48.626] } [15:31:48.626] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:48.626] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:48.626] base::sink(type = "output", split = FALSE) [15:31:48.626] base::close(...future.stdout) [15:31:48.626] }, add = TRUE) [15:31:48.626] } [15:31:48.626] ...future.frame <- base::sys.nframe() [15:31:48.626] ...future.conditions <- base::list() [15:31:48.626] ...future.rng <- base::globalenv()$.Random.seed [15:31:48.626] if (FALSE) { [15:31:48.626] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:48.626] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:48.626] } [15:31:48.626] ...future.result <- base::tryCatch({ [15:31:48.626] base::withCallingHandlers({ [15:31:48.626] ...future.value <- base::withVisible(base::local({ [15:31:48.626] do.call(function(...) { [15:31:48.626] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.626] if (!identical(...future.globals.maxSize.org, [15:31:48.626] ...future.globals.maxSize)) { [15:31:48.626] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.626] on.exit(options(oopts), add = TRUE) [15:31:48.626] } [15:31:48.626] { [15:31:48.626] lapply(seq_along(...future.elements_ii), [15:31:48.626] FUN = function(jj) { [15:31:48.626] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.626] ...future.FUN(...future.X_jj, ...) [15:31:48.626] }) [15:31:48.626] } [15:31:48.626] }, args = future.call.arguments) [15:31:48.626] })) [15:31:48.626] future::FutureResult(value = ...future.value$value, [15:31:48.626] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.626] ...future.rng), globalenv = if (FALSE) [15:31:48.626] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:48.626] ...future.globalenv.names)) [15:31:48.626] else NULL, started = ...future.startTime, version = "1.8") [15:31:48.626] }, condition = base::local({ [15:31:48.626] c <- base::c [15:31:48.626] inherits <- base::inherits [15:31:48.626] invokeRestart <- base::invokeRestart [15:31:48.626] length <- base::length [15:31:48.626] list <- base::list [15:31:48.626] seq.int <- base::seq.int [15:31:48.626] signalCondition <- base::signalCondition [15:31:48.626] sys.calls <- base::sys.calls [15:31:48.626] `[[` <- base::`[[` [15:31:48.626] `+` <- base::`+` [15:31:48.626] `<<-` <- base::`<<-` [15:31:48.626] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:48.626] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:48.626] 3L)] [15:31:48.626] } [15:31:48.626] function(cond) { [15:31:48.626] is_error <- inherits(cond, "error") [15:31:48.626] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:48.626] NULL) [15:31:48.626] if (is_error) { [15:31:48.626] sessionInformation <- function() { [15:31:48.626] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:48.626] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:48.626] search = base::search(), system = base::Sys.info()) [15:31:48.626] } [15:31:48.626] ...future.conditions[[length(...future.conditions) + [15:31:48.626] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:48.626] cond$call), session = sessionInformation(), [15:31:48.626] timestamp = base::Sys.time(), signaled = 0L) [15:31:48.626] signalCondition(cond) [15:31:48.626] } [15:31:48.626] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:48.626] "immediateCondition"))) { [15:31:48.626] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:48.626] ...future.conditions[[length(...future.conditions) + [15:31:48.626] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:48.626] if (TRUE && !signal) { [15:31:48.626] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.626] { [15:31:48.626] inherits <- base::inherits [15:31:48.626] invokeRestart <- base::invokeRestart [15:31:48.626] is.null <- base::is.null [15:31:48.626] muffled <- FALSE [15:31:48.626] if (inherits(cond, "message")) { [15:31:48.626] muffled <- grepl(pattern, "muffleMessage") [15:31:48.626] if (muffled) [15:31:48.626] invokeRestart("muffleMessage") [15:31:48.626] } [15:31:48.626] else if (inherits(cond, "warning")) { [15:31:48.626] muffled <- grepl(pattern, "muffleWarning") [15:31:48.626] if (muffled) [15:31:48.626] invokeRestart("muffleWarning") [15:31:48.626] } [15:31:48.626] else if (inherits(cond, "condition")) { [15:31:48.626] if (!is.null(pattern)) { [15:31:48.626] computeRestarts <- base::computeRestarts [15:31:48.626] grepl <- base::grepl [15:31:48.626] restarts <- computeRestarts(cond) [15:31:48.626] for (restart in restarts) { [15:31:48.626] name <- restart$name [15:31:48.626] if (is.null(name)) [15:31:48.626] next [15:31:48.626] if (!grepl(pattern, name)) [15:31:48.626] next [15:31:48.626] invokeRestart(restart) [15:31:48.626] muffled <- TRUE [15:31:48.626] break [15:31:48.626] } [15:31:48.626] } [15:31:48.626] } [15:31:48.626] invisible(muffled) [15:31:48.626] } [15:31:48.626] muffleCondition(cond, pattern = "^muffle") [15:31:48.626] } [15:31:48.626] } [15:31:48.626] else { [15:31:48.626] if (TRUE) { [15:31:48.626] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.626] { [15:31:48.626] inherits <- base::inherits [15:31:48.626] invokeRestart <- base::invokeRestart [15:31:48.626] is.null <- base::is.null [15:31:48.626] muffled <- FALSE [15:31:48.626] if (inherits(cond, "message")) { [15:31:48.626] muffled <- grepl(pattern, "muffleMessage") [15:31:48.626] if (muffled) [15:31:48.626] invokeRestart("muffleMessage") [15:31:48.626] } [15:31:48.626] else if (inherits(cond, "warning")) { [15:31:48.626] muffled <- grepl(pattern, "muffleWarning") [15:31:48.626] if (muffled) [15:31:48.626] invokeRestart("muffleWarning") [15:31:48.626] } [15:31:48.626] else if (inherits(cond, "condition")) { [15:31:48.626] if (!is.null(pattern)) { [15:31:48.626] computeRestarts <- base::computeRestarts [15:31:48.626] grepl <- base::grepl [15:31:48.626] restarts <- computeRestarts(cond) [15:31:48.626] for (restart in restarts) { [15:31:48.626] name <- restart$name [15:31:48.626] if (is.null(name)) [15:31:48.626] next [15:31:48.626] if (!grepl(pattern, name)) [15:31:48.626] next [15:31:48.626] invokeRestart(restart) [15:31:48.626] muffled <- TRUE [15:31:48.626] break [15:31:48.626] } [15:31:48.626] } [15:31:48.626] } [15:31:48.626] invisible(muffled) [15:31:48.626] } [15:31:48.626] muffleCondition(cond, pattern = "^muffle") [15:31:48.626] } [15:31:48.626] } [15:31:48.626] } [15:31:48.626] })) [15:31:48.626] }, error = function(ex) { [15:31:48.626] base::structure(base::list(value = NULL, visible = NULL, [15:31:48.626] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.626] ...future.rng), started = ...future.startTime, [15:31:48.626] finished = Sys.time(), session_uuid = NA_character_, [15:31:48.626] version = "1.8"), class = "FutureResult") [15:31:48.626] }, finally = { [15:31:48.626] if (!identical(...future.workdir, getwd())) [15:31:48.626] setwd(...future.workdir) [15:31:48.626] { [15:31:48.626] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:48.626] ...future.oldOptions$nwarnings <- NULL [15:31:48.626] } [15:31:48.626] base::options(...future.oldOptions) [15:31:48.626] if (.Platform$OS.type == "windows") { [15:31:48.626] old_names <- names(...future.oldEnvVars) [15:31:48.626] envs <- base::Sys.getenv() [15:31:48.626] names <- names(envs) [15:31:48.626] common <- intersect(names, old_names) [15:31:48.626] added <- setdiff(names, old_names) [15:31:48.626] removed <- setdiff(old_names, names) [15:31:48.626] changed <- common[...future.oldEnvVars[common] != [15:31:48.626] envs[common]] [15:31:48.626] NAMES <- toupper(changed) [15:31:48.626] args <- list() [15:31:48.626] for (kk in seq_along(NAMES)) { [15:31:48.626] name <- changed[[kk]] [15:31:48.626] NAME <- NAMES[[kk]] [15:31:48.626] if (name != NAME && is.element(NAME, old_names)) [15:31:48.626] next [15:31:48.626] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.626] } [15:31:48.626] NAMES <- toupper(added) [15:31:48.626] for (kk in seq_along(NAMES)) { [15:31:48.626] name <- added[[kk]] [15:31:48.626] NAME <- NAMES[[kk]] [15:31:48.626] if (name != NAME && is.element(NAME, old_names)) [15:31:48.626] next [15:31:48.626] args[[name]] <- "" [15:31:48.626] } [15:31:48.626] NAMES <- toupper(removed) [15:31:48.626] for (kk in seq_along(NAMES)) { [15:31:48.626] name <- removed[[kk]] [15:31:48.626] NAME <- NAMES[[kk]] [15:31:48.626] if (name != NAME && is.element(NAME, old_names)) [15:31:48.626] next [15:31:48.626] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.626] } [15:31:48.626] if (length(args) > 0) [15:31:48.626] base::do.call(base::Sys.setenv, args = args) [15:31:48.626] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:48.626] } [15:31:48.626] else { [15:31:48.626] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:48.626] } [15:31:48.626] { [15:31:48.626] if (base::length(...future.futureOptionsAdded) > [15:31:48.626] 0L) { [15:31:48.626] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:48.626] base::names(opts) <- ...future.futureOptionsAdded [15:31:48.626] base::options(opts) [15:31:48.626] } [15:31:48.626] { [15:31:48.626] { [15:31:48.626] NULL [15:31:48.626] RNGkind("Mersenne-Twister") [15:31:48.626] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:48.626] inherits = FALSE) [15:31:48.626] } [15:31:48.626] options(future.plan = NULL) [15:31:48.626] if (is.na(NA_character_)) [15:31:48.626] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.626] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:48.626] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:48.626] .init = FALSE) [15:31:48.626] } [15:31:48.626] } [15:31:48.626] } [15:31:48.626] }) [15:31:48.626] if (TRUE) { [15:31:48.626] base::sink(type = "output", split = FALSE) [15:31:48.626] if (TRUE) { [15:31:48.626] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:48.626] } [15:31:48.626] else { [15:31:48.626] ...future.result["stdout"] <- base::list(NULL) [15:31:48.626] } [15:31:48.626] base::close(...future.stdout) [15:31:48.626] ...future.stdout <- NULL [15:31:48.626] } [15:31:48.626] ...future.result$conditions <- ...future.conditions [15:31:48.626] ...future.result$finished <- base::Sys.time() [15:31:48.626] ...future.result [15:31:48.626] } [15:31:48.633] assign_globals() ... [15:31:48.633] List of 5 [15:31:48.633] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:48.633] $ future.call.arguments :List of 1 [15:31:48.633] ..$ length: int 2 [15:31:48.633] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:48.633] $ ...future.elements_ii :List of 1 [15:31:48.633] ..$ c: chr "list" [15:31:48.633] $ ...future.seeds_ii : NULL [15:31:48.633] $ ...future.globals.maxSize: NULL [15:31:48.633] - attr(*, "where")=List of 5 [15:31:48.633] ..$ ...future.FUN : [15:31:48.633] ..$ future.call.arguments : [15:31:48.633] ..$ ...future.elements_ii : [15:31:48.633] ..$ ...future.seeds_ii : [15:31:48.633] ..$ ...future.globals.maxSize: [15:31:48.633] - attr(*, "resolved")= logi FALSE [15:31:48.633] - attr(*, "total_size")= num 2240 [15:31:48.633] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:48.633] - attr(*, "already-done")= logi TRUE [15:31:48.642] - copied '...future.FUN' to environment [15:31:48.643] - copied 'future.call.arguments' to environment [15:31:48.643] - copied '...future.elements_ii' to environment [15:31:48.643] - copied '...future.seeds_ii' to environment [15:31:48.643] - copied '...future.globals.maxSize' to environment [15:31:48.644] assign_globals() ... done [15:31:48.645] plan(): Setting new future strategy stack: [15:31:48.645] List of future strategies: [15:31:48.645] 1. sequential: [15:31:48.645] - args: function (..., envir = parent.frame(), workers = "") [15:31:48.645] - tweaked: FALSE [15:31:48.645] - call: NULL [15:31:48.647] plan(): nbrOfWorkers() = 1 [15:31:48.649] plan(): Setting new future strategy stack: [15:31:48.650] List of future strategies: [15:31:48.650] 1. multisession: [15:31:48.650] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:48.650] - tweaked: FALSE [15:31:48.650] - call: plan(strategy) [15:31:48.655] plan(): nbrOfWorkers() = 1 [15:31:48.655] SequentialFuture started (and completed) [15:31:48.656] - Launch lazy future ... done [15:31:48.656] run() for 'SequentialFuture' ... done [15:31:48.656] Created future: [15:31:48.657] SequentialFuture: [15:31:48.657] Label: 'future_lapply-4' [15:31:48.657] Expression: [15:31:48.657] { [15:31:48.657] do.call(function(...) { [15:31:48.657] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.657] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.657] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.657] on.exit(options(oopts), add = TRUE) [15:31:48.657] } [15:31:48.657] { [15:31:48.657] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.657] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.657] ...future.FUN(...future.X_jj, ...) [15:31:48.657] }) [15:31:48.657] } [15:31:48.657] }, args = future.call.arguments) [15:31:48.657] } [15:31:48.657] Lazy evaluation: FALSE [15:31:48.657] Asynchronous evaluation: FALSE [15:31:48.657] Local evaluation: TRUE [15:31:48.657] Environment: R_GlobalEnv [15:31:48.657] Capture standard output: TRUE [15:31:48.657] Capture condition classes: 'condition' (excluding 'nothing') [15:31:48.657] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:48.657] Packages: [15:31:48.657] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:48.657] Resolved: TRUE [15:31:48.657] Value: 0 bytes of class 'list' [15:31:48.657] Early signaling: FALSE [15:31:48.657] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:48.657] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.659] Chunk #4 of 4 ... DONE [15:31:48.660] Launching 4 futures (chunks) ... DONE [15:31:48.660] Resolving 4 futures (chunks) ... [15:31:48.660] resolve() on list ... [15:31:48.661] recursive: 0 [15:31:48.661] length: 4 [15:31:48.661] [15:31:48.662] resolved() for 'SequentialFuture' ... [15:31:48.662] - state: 'finished' [15:31:48.662] - run: TRUE [15:31:48.663] - result: 'FutureResult' [15:31:48.663] resolved() for 'SequentialFuture' ... done [15:31:48.663] Future #1 [15:31:48.664] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:48.664] - nx: 4 [15:31:48.664] - relay: TRUE [15:31:48.665] - stdout: TRUE [15:31:48.665] - signal: TRUE [15:31:48.665] - resignal: FALSE [15:31:48.665] - force: TRUE [15:31:48.666] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [15:31:48.666] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [15:31:48.666] - until=1 [15:31:48.667] - relaying element #1 [15:31:48.667] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:48.667] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:48.668] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:48.668] length: 3 (resolved future 1) [15:31:48.668] resolved() for 'SequentialFuture' ... [15:31:48.669] - state: 'finished' [15:31:48.669] - run: TRUE [15:31:48.669] - result: 'FutureResult' [15:31:48.670] resolved() for 'SequentialFuture' ... done [15:31:48.670] Future #2 [15:31:48.671] signalConditionsASAP(SequentialFuture, pos=2) ... [15:31:48.671] - nx: 4 [15:31:48.671] - relay: TRUE [15:31:48.672] - stdout: TRUE [15:31:48.672] - signal: TRUE [15:31:48.672] - resignal: FALSE [15:31:48.672] - force: TRUE [15:31:48.673] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:48.673] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:48.673] - until=2 [15:31:48.674] - relaying element #2 [15:31:48.674] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:48.674] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:48.675] signalConditionsASAP(SequentialFuture, pos=2) ... done [15:31:48.675] length: 2 (resolved future 2) [15:31:48.675] resolved() for 'SequentialFuture' ... [15:31:48.676] - state: 'finished' [15:31:48.676] - run: TRUE [15:31:48.676] - result: 'FutureResult' [15:31:48.677] resolved() for 'SequentialFuture' ... done [15:31:48.677] Future #3 [15:31:48.678] signalConditionsASAP(SequentialFuture, pos=3) ... [15:31:48.678] - nx: 4 [15:31:48.678] - relay: TRUE [15:31:48.678] - stdout: TRUE [15:31:48.679] - signal: TRUE [15:31:48.679] - resignal: FALSE [15:31:48.679] - force: TRUE [15:31:48.680] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:48.680] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:48.680] - until=3 [15:31:48.681] - relaying element #3 [15:31:48.681] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:48.681] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:48.682] signalConditionsASAP(SequentialFuture, pos=3) ... done [15:31:48.682] length: 1 (resolved future 3) [15:31:48.682] resolved() for 'SequentialFuture' ... [15:31:48.683] - state: 'finished' [15:31:48.683] - run: TRUE [15:31:48.683] - result: 'FutureResult' [15:31:48.684] resolved() for 'SequentialFuture' ... done [15:31:48.684] Future #4 [15:31:48.685] signalConditionsASAP(SequentialFuture, pos=4) ... [15:31:48.685] - nx: 4 [15:31:48.685] - relay: TRUE [15:31:48.685] - stdout: TRUE [15:31:48.686] - signal: TRUE [15:31:48.686] - resignal: FALSE [15:31:48.686] - force: TRUE [15:31:48.687] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:48.687] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:48.687] - until=4 [15:31:48.687] - relaying element #4 [15:31:48.688] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:48.688] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:48.689] signalConditionsASAP(SequentialFuture, pos=4) ... done [15:31:48.689] length: 0 (resolved future 4) [15:31:48.689] Relaying remaining futures [15:31:48.690] signalConditionsASAP(NULL, pos=0) ... [15:31:48.690] - nx: 4 [15:31:48.690] - relay: TRUE [15:31:48.690] - stdout: TRUE [15:31:48.691] - signal: TRUE [15:31:48.691] - resignal: FALSE [15:31:48.691] - force: TRUE [15:31:48.692] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:48.692] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [15:31:48.692] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:48.693] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:48.693] signalConditionsASAP(NULL, pos=0) ... done [15:31:48.693] resolve() on list ... DONE [15:31:48.694] - Number of value chunks collected: 4 [15:31:48.694] Resolving 4 futures (chunks) ... DONE [15:31:48.695] Reducing values from 4 chunks ... [15:31:48.695] - Number of values collected after concatenation: 4 [15:31:48.695] - Number of values expected: 4 [15:31:48.696] Reducing values from 4 chunks ... DONE [15:31:48.696] 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, ...) ... [15:31:48.701] future_lapply() ... [15:31:48.705] Number of chunks: 4 [15:31:48.706] getGlobalsAndPackagesXApply() ... [15:31:48.706] - future.globals: TRUE [15:31:48.706] getGlobalsAndPackages() ... [15:31:48.707] Searching for globals... [15:31:48.709] - globals found: [2] 'FUN', '.Internal' [15:31:48.709] Searching for globals ... DONE [15:31:48.709] Resolving globals: FALSE [15:31:48.710] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:48.711] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:48.711] - globals: [1] 'FUN' [15:31:48.711] [15:31:48.712] getGlobalsAndPackages() ... DONE [15:31:48.712] - globals found/used: [n=1] 'FUN' [15:31:48.712] - needed namespaces: [n=0] [15:31:48.712] Finding globals ... DONE [15:31:48.713] - use_args: TRUE [15:31:48.713] - Getting '...' globals ... [15:31:48.713] resolve() on list ... [15:31:48.714] recursive: 0 [15:31:48.714] length: 1 [15:31:48.714] elements: '...' [15:31:48.715] length: 0 (resolved future 1) [15:31:48.715] resolve() on list ... DONE [15:31:48.715] - '...' content: [n=1] 'length' [15:31:48.715] List of 1 [15:31:48.715] $ ...:List of 1 [15:31:48.715] ..$ length: int 2 [15:31:48.715] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:48.715] - attr(*, "where")=List of 1 [15:31:48.715] ..$ ...: [15:31:48.715] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:48.715] - attr(*, "resolved")= logi TRUE [15:31:48.715] - attr(*, "total_size")= num NA [15:31:48.721] - Getting '...' globals ... DONE [15:31:48.721] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:48.722] List of 2 [15:31:48.722] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:48.722] $ ... :List of 1 [15:31:48.722] ..$ length: int 2 [15:31:48.722] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:48.722] - attr(*, "where")=List of 2 [15:31:48.722] ..$ ...future.FUN: [15:31:48.722] ..$ ... : [15:31:48.722] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:48.722] - attr(*, "resolved")= logi FALSE [15:31:48.722] - attr(*, "total_size")= num 2240 [15:31:48.727] Packages to be attached in all futures: [n=0] [15:31:48.728] getGlobalsAndPackagesXApply() ... DONE [15:31:48.728] Number of futures (= number of chunks): 4 [15:31:48.728] Launching 4 futures (chunks) ... [15:31:48.729] Chunk #1 of 4 ... [15:31:48.729] - Finding globals in 'X' for chunk #1 ... [15:31:48.729] getGlobalsAndPackages() ... [15:31:48.729] Searching for globals... [15:31:48.730] [15:31:48.730] Searching for globals ... DONE [15:31:48.730] - globals: [0] [15:31:48.731] getGlobalsAndPackages() ... DONE [15:31:48.731] + additional globals found: [n=0] [15:31:48.731] + additional namespaces needed: [n=0] [15:31:48.731] - Finding globals in 'X' for chunk #1 ... DONE [15:31:48.732] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:48.732] - seeds: [15:31:48.732] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.732] getGlobalsAndPackages() ... [15:31:48.733] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.733] Resolving globals: FALSE [15:31:48.733] Tweak future expression to call with '...' arguments ... [15:31:48.734] { [15:31:48.734] do.call(function(...) { [15:31:48.734] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.734] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.734] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.734] on.exit(options(oopts), add = TRUE) [15:31:48.734] } [15:31:48.734] { [15:31:48.734] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.734] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.734] ...future.FUN(...future.X_jj, ...) [15:31:48.734] }) [15:31:48.734] } [15:31:48.734] }, args = future.call.arguments) [15:31:48.734] } [15:31:48.734] Tweak future expression to call with '...' arguments ... DONE [15:31:48.735] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.735] [15:31:48.736] getGlobalsAndPackages() ... DONE [15:31:48.736] run() for 'Future' ... [15:31:48.737] - state: 'created' [15:31:48.737] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:48.741] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.742] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:48.742] - Field: 'label' [15:31:48.742] - Field: 'local' [15:31:48.743] - Field: 'owner' [15:31:48.743] - Field: 'envir' [15:31:48.743] - Field: 'packages' [15:31:48.743] - Field: 'gc' [15:31:48.744] - Field: 'conditions' [15:31:48.744] - Field: 'expr' [15:31:48.744] - Field: 'uuid' [15:31:48.745] - Field: 'seed' [15:31:48.745] - Field: 'version' [15:31:48.745] - Field: 'result' [15:31:48.746] - Field: 'asynchronous' [15:31:48.746] - Field: 'calls' [15:31:48.746] - Field: 'globals' [15:31:48.746] - Field: 'stdout' [15:31:48.747] - Field: 'earlySignal' [15:31:48.747] - Field: 'lazy' [15:31:48.747] - Field: 'state' [15:31:48.748] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:48.748] - Launch lazy future ... [15:31:48.748] Packages needed by the future expression (n = 0): [15:31:48.749] Packages needed by future strategies (n = 0): [15:31:48.750] { [15:31:48.750] { [15:31:48.750] { [15:31:48.750] ...future.startTime <- base::Sys.time() [15:31:48.750] { [15:31:48.750] { [15:31:48.750] { [15:31:48.750] base::local({ [15:31:48.750] has_future <- base::requireNamespace("future", [15:31:48.750] quietly = TRUE) [15:31:48.750] if (has_future) { [15:31:48.750] ns <- base::getNamespace("future") [15:31:48.750] version <- ns[[".package"]][["version"]] [15:31:48.750] if (is.null(version)) [15:31:48.750] version <- utils::packageVersion("future") [15:31:48.750] } [15:31:48.750] else { [15:31:48.750] version <- NULL [15:31:48.750] } [15:31:48.750] if (!has_future || version < "1.8.0") { [15:31:48.750] info <- base::c(r_version = base::gsub("R version ", [15:31:48.750] "", base::R.version$version.string), [15:31:48.750] platform = base::sprintf("%s (%s-bit)", [15:31:48.750] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:48.750] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:48.750] "release", "version")], collapse = " "), [15:31:48.750] hostname = base::Sys.info()[["nodename"]]) [15:31:48.750] info <- base::sprintf("%s: %s", base::names(info), [15:31:48.750] info) [15:31:48.750] info <- base::paste(info, collapse = "; ") [15:31:48.750] if (!has_future) { [15:31:48.750] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:48.750] info) [15:31:48.750] } [15:31:48.750] else { [15:31:48.750] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:48.750] info, version) [15:31:48.750] } [15:31:48.750] base::stop(msg) [15:31:48.750] } [15:31:48.750] }) [15:31:48.750] } [15:31:48.750] ...future.strategy.old <- future::plan("list") [15:31:48.750] options(future.plan = NULL) [15:31:48.750] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.750] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:48.750] } [15:31:48.750] ...future.workdir <- getwd() [15:31:48.750] } [15:31:48.750] ...future.oldOptions <- base::as.list(base::.Options) [15:31:48.750] ...future.oldEnvVars <- base::Sys.getenv() [15:31:48.750] } [15:31:48.750] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:48.750] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:48.750] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:48.750] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:48.750] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:48.750] future.stdout.windows.reencode = NULL, width = 80L) [15:31:48.750] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:48.750] base::names(...future.oldOptions)) [15:31:48.750] } [15:31:48.750] if (FALSE) { [15:31:48.750] } [15:31:48.750] else { [15:31:48.750] if (TRUE) { [15:31:48.750] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:48.750] open = "w") [15:31:48.750] } [15:31:48.750] else { [15:31:48.750] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:48.750] windows = "NUL", "/dev/null"), open = "w") [15:31:48.750] } [15:31:48.750] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:48.750] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:48.750] base::sink(type = "output", split = FALSE) [15:31:48.750] base::close(...future.stdout) [15:31:48.750] }, add = TRUE) [15:31:48.750] } [15:31:48.750] ...future.frame <- base::sys.nframe() [15:31:48.750] ...future.conditions <- base::list() [15:31:48.750] ...future.rng <- base::globalenv()$.Random.seed [15:31:48.750] if (FALSE) { [15:31:48.750] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:48.750] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:48.750] } [15:31:48.750] ...future.result <- base::tryCatch({ [15:31:48.750] base::withCallingHandlers({ [15:31:48.750] ...future.value <- base::withVisible(base::local({ [15:31:48.750] do.call(function(...) { [15:31:48.750] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.750] if (!identical(...future.globals.maxSize.org, [15:31:48.750] ...future.globals.maxSize)) { [15:31:48.750] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.750] on.exit(options(oopts), add = TRUE) [15:31:48.750] } [15:31:48.750] { [15:31:48.750] lapply(seq_along(...future.elements_ii), [15:31:48.750] FUN = function(jj) { [15:31:48.750] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.750] ...future.FUN(...future.X_jj, ...) [15:31:48.750] }) [15:31:48.750] } [15:31:48.750] }, args = future.call.arguments) [15:31:48.750] })) [15:31:48.750] future::FutureResult(value = ...future.value$value, [15:31:48.750] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.750] ...future.rng), globalenv = if (FALSE) [15:31:48.750] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:48.750] ...future.globalenv.names)) [15:31:48.750] else NULL, started = ...future.startTime, version = "1.8") [15:31:48.750] }, condition = base::local({ [15:31:48.750] c <- base::c [15:31:48.750] inherits <- base::inherits [15:31:48.750] invokeRestart <- base::invokeRestart [15:31:48.750] length <- base::length [15:31:48.750] list <- base::list [15:31:48.750] seq.int <- base::seq.int [15:31:48.750] signalCondition <- base::signalCondition [15:31:48.750] sys.calls <- base::sys.calls [15:31:48.750] `[[` <- base::`[[` [15:31:48.750] `+` <- base::`+` [15:31:48.750] `<<-` <- base::`<<-` [15:31:48.750] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:48.750] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:48.750] 3L)] [15:31:48.750] } [15:31:48.750] function(cond) { [15:31:48.750] is_error <- inherits(cond, "error") [15:31:48.750] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:48.750] NULL) [15:31:48.750] if (is_error) { [15:31:48.750] sessionInformation <- function() { [15:31:48.750] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:48.750] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:48.750] search = base::search(), system = base::Sys.info()) [15:31:48.750] } [15:31:48.750] ...future.conditions[[length(...future.conditions) + [15:31:48.750] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:48.750] cond$call), session = sessionInformation(), [15:31:48.750] timestamp = base::Sys.time(), signaled = 0L) [15:31:48.750] signalCondition(cond) [15:31:48.750] } [15:31:48.750] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:48.750] "immediateCondition"))) { [15:31:48.750] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:48.750] ...future.conditions[[length(...future.conditions) + [15:31:48.750] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:48.750] if (TRUE && !signal) { [15:31:48.750] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.750] { [15:31:48.750] inherits <- base::inherits [15:31:48.750] invokeRestart <- base::invokeRestart [15:31:48.750] is.null <- base::is.null [15:31:48.750] muffled <- FALSE [15:31:48.750] if (inherits(cond, "message")) { [15:31:48.750] muffled <- grepl(pattern, "muffleMessage") [15:31:48.750] if (muffled) [15:31:48.750] invokeRestart("muffleMessage") [15:31:48.750] } [15:31:48.750] else if (inherits(cond, "warning")) { [15:31:48.750] muffled <- grepl(pattern, "muffleWarning") [15:31:48.750] if (muffled) [15:31:48.750] invokeRestart("muffleWarning") [15:31:48.750] } [15:31:48.750] else if (inherits(cond, "condition")) { [15:31:48.750] if (!is.null(pattern)) { [15:31:48.750] computeRestarts <- base::computeRestarts [15:31:48.750] grepl <- base::grepl [15:31:48.750] restarts <- computeRestarts(cond) [15:31:48.750] for (restart in restarts) { [15:31:48.750] name <- restart$name [15:31:48.750] if (is.null(name)) [15:31:48.750] next [15:31:48.750] if (!grepl(pattern, name)) [15:31:48.750] next [15:31:48.750] invokeRestart(restart) [15:31:48.750] muffled <- TRUE [15:31:48.750] break [15:31:48.750] } [15:31:48.750] } [15:31:48.750] } [15:31:48.750] invisible(muffled) [15:31:48.750] } [15:31:48.750] muffleCondition(cond, pattern = "^muffle") [15:31:48.750] } [15:31:48.750] } [15:31:48.750] else { [15:31:48.750] if (TRUE) { [15:31:48.750] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.750] { [15:31:48.750] inherits <- base::inherits [15:31:48.750] invokeRestart <- base::invokeRestart [15:31:48.750] is.null <- base::is.null [15:31:48.750] muffled <- FALSE [15:31:48.750] if (inherits(cond, "message")) { [15:31:48.750] muffled <- grepl(pattern, "muffleMessage") [15:31:48.750] if (muffled) [15:31:48.750] invokeRestart("muffleMessage") [15:31:48.750] } [15:31:48.750] else if (inherits(cond, "warning")) { [15:31:48.750] muffled <- grepl(pattern, "muffleWarning") [15:31:48.750] if (muffled) [15:31:48.750] invokeRestart("muffleWarning") [15:31:48.750] } [15:31:48.750] else if (inherits(cond, "condition")) { [15:31:48.750] if (!is.null(pattern)) { [15:31:48.750] computeRestarts <- base::computeRestarts [15:31:48.750] grepl <- base::grepl [15:31:48.750] restarts <- computeRestarts(cond) [15:31:48.750] for (restart in restarts) { [15:31:48.750] name <- restart$name [15:31:48.750] if (is.null(name)) [15:31:48.750] next [15:31:48.750] if (!grepl(pattern, name)) [15:31:48.750] next [15:31:48.750] invokeRestart(restart) [15:31:48.750] muffled <- TRUE [15:31:48.750] break [15:31:48.750] } [15:31:48.750] } [15:31:48.750] } [15:31:48.750] invisible(muffled) [15:31:48.750] } [15:31:48.750] muffleCondition(cond, pattern = "^muffle") [15:31:48.750] } [15:31:48.750] } [15:31:48.750] } [15:31:48.750] })) [15:31:48.750] }, error = function(ex) { [15:31:48.750] base::structure(base::list(value = NULL, visible = NULL, [15:31:48.750] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.750] ...future.rng), started = ...future.startTime, [15:31:48.750] finished = Sys.time(), session_uuid = NA_character_, [15:31:48.750] version = "1.8"), class = "FutureResult") [15:31:48.750] }, finally = { [15:31:48.750] if (!identical(...future.workdir, getwd())) [15:31:48.750] setwd(...future.workdir) [15:31:48.750] { [15:31:48.750] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:48.750] ...future.oldOptions$nwarnings <- NULL [15:31:48.750] } [15:31:48.750] base::options(...future.oldOptions) [15:31:48.750] if (.Platform$OS.type == "windows") { [15:31:48.750] old_names <- names(...future.oldEnvVars) [15:31:48.750] envs <- base::Sys.getenv() [15:31:48.750] names <- names(envs) [15:31:48.750] common <- intersect(names, old_names) [15:31:48.750] added <- setdiff(names, old_names) [15:31:48.750] removed <- setdiff(old_names, names) [15:31:48.750] changed <- common[...future.oldEnvVars[common] != [15:31:48.750] envs[common]] [15:31:48.750] NAMES <- toupper(changed) [15:31:48.750] args <- list() [15:31:48.750] for (kk in seq_along(NAMES)) { [15:31:48.750] name <- changed[[kk]] [15:31:48.750] NAME <- NAMES[[kk]] [15:31:48.750] if (name != NAME && is.element(NAME, old_names)) [15:31:48.750] next [15:31:48.750] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.750] } [15:31:48.750] NAMES <- toupper(added) [15:31:48.750] for (kk in seq_along(NAMES)) { [15:31:48.750] name <- added[[kk]] [15:31:48.750] NAME <- NAMES[[kk]] [15:31:48.750] if (name != NAME && is.element(NAME, old_names)) [15:31:48.750] next [15:31:48.750] args[[name]] <- "" [15:31:48.750] } [15:31:48.750] NAMES <- toupper(removed) [15:31:48.750] for (kk in seq_along(NAMES)) { [15:31:48.750] name <- removed[[kk]] [15:31:48.750] NAME <- NAMES[[kk]] [15:31:48.750] if (name != NAME && is.element(NAME, old_names)) [15:31:48.750] next [15:31:48.750] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.750] } [15:31:48.750] if (length(args) > 0) [15:31:48.750] base::do.call(base::Sys.setenv, args = args) [15:31:48.750] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:48.750] } [15:31:48.750] else { [15:31:48.750] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:48.750] } [15:31:48.750] { [15:31:48.750] if (base::length(...future.futureOptionsAdded) > [15:31:48.750] 0L) { [15:31:48.750] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:48.750] base::names(opts) <- ...future.futureOptionsAdded [15:31:48.750] base::options(opts) [15:31:48.750] } [15:31:48.750] { [15:31:48.750] { [15:31:48.750] NULL [15:31:48.750] RNGkind("Mersenne-Twister") [15:31:48.750] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:48.750] inherits = FALSE) [15:31:48.750] } [15:31:48.750] options(future.plan = NULL) [15:31:48.750] if (is.na(NA_character_)) [15:31:48.750] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.750] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:48.750] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:48.750] .init = FALSE) [15:31:48.750] } [15:31:48.750] } [15:31:48.750] } [15:31:48.750] }) [15:31:48.750] if (TRUE) { [15:31:48.750] base::sink(type = "output", split = FALSE) [15:31:48.750] if (TRUE) { [15:31:48.750] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:48.750] } [15:31:48.750] else { [15:31:48.750] ...future.result["stdout"] <- base::list(NULL) [15:31:48.750] } [15:31:48.750] base::close(...future.stdout) [15:31:48.750] ...future.stdout <- NULL [15:31:48.750] } [15:31:48.750] ...future.result$conditions <- ...future.conditions [15:31:48.750] ...future.result$finished <- base::Sys.time() [15:31:48.750] ...future.result [15:31:48.750] } [15:31:48.756] assign_globals() ... [15:31:48.756] List of 5 [15:31:48.756] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:48.756] $ future.call.arguments :List of 1 [15:31:48.756] ..$ length: int 2 [15:31:48.756] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:48.756] $ ...future.elements_ii :List of 1 [15:31:48.756] ..$ a: chr "integer" [15:31:48.756] $ ...future.seeds_ii : NULL [15:31:48.756] $ ...future.globals.maxSize: NULL [15:31:48.756] - attr(*, "where")=List of 5 [15:31:48.756] ..$ ...future.FUN : [15:31:48.756] ..$ future.call.arguments : [15:31:48.756] ..$ ...future.elements_ii : [15:31:48.756] ..$ ...future.seeds_ii : [15:31:48.756] ..$ ...future.globals.maxSize: [15:31:48.756] - attr(*, "resolved")= logi FALSE [15:31:48.756] - attr(*, "total_size")= num 2240 [15:31:48.756] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:48.756] - attr(*, "already-done")= logi TRUE [15:31:48.766] - copied '...future.FUN' to environment [15:31:48.766] - copied 'future.call.arguments' to environment [15:31:48.766] - copied '...future.elements_ii' to environment [15:31:48.767] - copied '...future.seeds_ii' to environment [15:31:48.767] - copied '...future.globals.maxSize' to environment [15:31:48.767] assign_globals() ... done [15:31:48.768] plan(): Setting new future strategy stack: [15:31:48.768] List of future strategies: [15:31:48.768] 1. sequential: [15:31:48.768] - args: function (..., envir = parent.frame(), workers = "") [15:31:48.768] - tweaked: FALSE [15:31:48.768] - call: NULL [15:31:48.769] plan(): nbrOfWorkers() = 1 [15:31:48.771] plan(): Setting new future strategy stack: [15:31:48.771] List of future strategies: [15:31:48.771] 1. multisession: [15:31:48.771] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:48.771] - tweaked: FALSE [15:31:48.771] - call: plan(strategy) [15:31:48.775] plan(): nbrOfWorkers() = 1 [15:31:48.775] SequentialFuture started (and completed) [15:31:48.776] - Launch lazy future ... done [15:31:48.776] run() for 'SequentialFuture' ... done [15:31:48.776] Created future: [15:31:48.777] SequentialFuture: [15:31:48.777] Label: 'future_lapply-1' [15:31:48.777] Expression: [15:31:48.777] { [15:31:48.777] do.call(function(...) { [15:31:48.777] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.777] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.777] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.777] on.exit(options(oopts), add = TRUE) [15:31:48.777] } [15:31:48.777] { [15:31:48.777] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.777] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.777] ...future.FUN(...future.X_jj, ...) [15:31:48.777] }) [15:31:48.777] } [15:31:48.777] }, args = future.call.arguments) [15:31:48.777] } [15:31:48.777] Lazy evaluation: FALSE [15:31:48.777] Asynchronous evaluation: FALSE [15:31:48.777] Local evaluation: TRUE [15:31:48.777] Environment: R_GlobalEnv [15:31:48.777] Capture standard output: TRUE [15:31:48.777] Capture condition classes: 'condition' (excluding 'nothing') [15:31:48.777] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:48.777] Packages: [15:31:48.777] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:48.777] Resolved: TRUE [15:31:48.777] Value: 56 bytes of class 'list' [15:31:48.777] Early signaling: FALSE [15:31:48.777] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:48.777] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.779] Chunk #1 of 4 ... DONE [15:31:48.779] Chunk #2 of 4 ... [15:31:48.779] - Finding globals in 'X' for chunk #2 ... [15:31:48.780] getGlobalsAndPackages() ... [15:31:48.780] Searching for globals... [15:31:48.780] [15:31:48.781] Searching for globals ... DONE [15:31:48.781] - globals: [0] [15:31:48.781] getGlobalsAndPackages() ... DONE [15:31:48.781] + additional globals found: [n=0] [15:31:48.782] + additional namespaces needed: [n=0] [15:31:48.782] - Finding globals in 'X' for chunk #2 ... DONE [15:31:48.782] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:48.782] - seeds: [15:31:48.783] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.783] getGlobalsAndPackages() ... [15:31:48.783] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.783] Resolving globals: FALSE [15:31:48.784] Tweak future expression to call with '...' arguments ... [15:31:48.784] { [15:31:48.784] do.call(function(...) { [15:31:48.784] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.784] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.784] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.784] on.exit(options(oopts), add = TRUE) [15:31:48.784] } [15:31:48.784] { [15:31:48.784] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.784] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.784] ...future.FUN(...future.X_jj, ...) [15:31:48.784] }) [15:31:48.784] } [15:31:48.784] }, args = future.call.arguments) [15:31:48.784] } [15:31:48.785] Tweak future expression to call with '...' arguments ... DONE [15:31:48.785] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.786] [15:31:48.786] getGlobalsAndPackages() ... DONE [15:31:48.787] run() for 'Future' ... [15:31:48.787] - state: 'created' [15:31:48.787] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:48.790] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.791] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:48.791] - Field: 'label' [15:31:48.791] - Field: 'local' [15:31:48.792] - Field: 'owner' [15:31:48.792] - Field: 'envir' [15:31:48.792] - Field: 'packages' [15:31:48.792] - Field: 'gc' [15:31:48.793] - Field: 'conditions' [15:31:48.793] - Field: 'expr' [15:31:48.793] - Field: 'uuid' [15:31:48.793] - Field: 'seed' [15:31:48.794] - Field: 'version' [15:31:48.794] - Field: 'result' [15:31:48.794] - Field: 'asynchronous' [15:31:48.794] - Field: 'calls' [15:31:48.795] - Field: 'globals' [15:31:48.795] - Field: 'stdout' [15:31:48.795] - Field: 'earlySignal' [15:31:48.795] - Field: 'lazy' [15:31:48.796] - Field: 'state' [15:31:48.796] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:48.796] - Launch lazy future ... [15:31:48.797] Packages needed by the future expression (n = 0): [15:31:48.797] Packages needed by future strategies (n = 0): [15:31:48.798] { [15:31:48.798] { [15:31:48.798] { [15:31:48.798] ...future.startTime <- base::Sys.time() [15:31:48.798] { [15:31:48.798] { [15:31:48.798] { [15:31:48.798] base::local({ [15:31:48.798] has_future <- base::requireNamespace("future", [15:31:48.798] quietly = TRUE) [15:31:48.798] if (has_future) { [15:31:48.798] ns <- base::getNamespace("future") [15:31:48.798] version <- ns[[".package"]][["version"]] [15:31:48.798] if (is.null(version)) [15:31:48.798] version <- utils::packageVersion("future") [15:31:48.798] } [15:31:48.798] else { [15:31:48.798] version <- NULL [15:31:48.798] } [15:31:48.798] if (!has_future || version < "1.8.0") { [15:31:48.798] info <- base::c(r_version = base::gsub("R version ", [15:31:48.798] "", base::R.version$version.string), [15:31:48.798] platform = base::sprintf("%s (%s-bit)", [15:31:48.798] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:48.798] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:48.798] "release", "version")], collapse = " "), [15:31:48.798] hostname = base::Sys.info()[["nodename"]]) [15:31:48.798] info <- base::sprintf("%s: %s", base::names(info), [15:31:48.798] info) [15:31:48.798] info <- base::paste(info, collapse = "; ") [15:31:48.798] if (!has_future) { [15:31:48.798] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:48.798] info) [15:31:48.798] } [15:31:48.798] else { [15:31:48.798] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:48.798] info, version) [15:31:48.798] } [15:31:48.798] base::stop(msg) [15:31:48.798] } [15:31:48.798] }) [15:31:48.798] } [15:31:48.798] ...future.strategy.old <- future::plan("list") [15:31:48.798] options(future.plan = NULL) [15:31:48.798] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.798] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:48.798] } [15:31:48.798] ...future.workdir <- getwd() [15:31:48.798] } [15:31:48.798] ...future.oldOptions <- base::as.list(base::.Options) [15:31:48.798] ...future.oldEnvVars <- base::Sys.getenv() [15:31:48.798] } [15:31:48.798] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:48.798] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:48.798] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:48.798] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:48.798] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:48.798] future.stdout.windows.reencode = NULL, width = 80L) [15:31:48.798] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:48.798] base::names(...future.oldOptions)) [15:31:48.798] } [15:31:48.798] if (FALSE) { [15:31:48.798] } [15:31:48.798] else { [15:31:48.798] if (TRUE) { [15:31:48.798] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:48.798] open = "w") [15:31:48.798] } [15:31:48.798] else { [15:31:48.798] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:48.798] windows = "NUL", "/dev/null"), open = "w") [15:31:48.798] } [15:31:48.798] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:48.798] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:48.798] base::sink(type = "output", split = FALSE) [15:31:48.798] base::close(...future.stdout) [15:31:48.798] }, add = TRUE) [15:31:48.798] } [15:31:48.798] ...future.frame <- base::sys.nframe() [15:31:48.798] ...future.conditions <- base::list() [15:31:48.798] ...future.rng <- base::globalenv()$.Random.seed [15:31:48.798] if (FALSE) { [15:31:48.798] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:48.798] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:48.798] } [15:31:48.798] ...future.result <- base::tryCatch({ [15:31:48.798] base::withCallingHandlers({ [15:31:48.798] ...future.value <- base::withVisible(base::local({ [15:31:48.798] do.call(function(...) { [15:31:48.798] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.798] if (!identical(...future.globals.maxSize.org, [15:31:48.798] ...future.globals.maxSize)) { [15:31:48.798] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.798] on.exit(options(oopts), add = TRUE) [15:31:48.798] } [15:31:48.798] { [15:31:48.798] lapply(seq_along(...future.elements_ii), [15:31:48.798] FUN = function(jj) { [15:31:48.798] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.798] ...future.FUN(...future.X_jj, ...) [15:31:48.798] }) [15:31:48.798] } [15:31:48.798] }, args = future.call.arguments) [15:31:48.798] })) [15:31:48.798] future::FutureResult(value = ...future.value$value, [15:31:48.798] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.798] ...future.rng), globalenv = if (FALSE) [15:31:48.798] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:48.798] ...future.globalenv.names)) [15:31:48.798] else NULL, started = ...future.startTime, version = "1.8") [15:31:48.798] }, condition = base::local({ [15:31:48.798] c <- base::c [15:31:48.798] inherits <- base::inherits [15:31:48.798] invokeRestart <- base::invokeRestart [15:31:48.798] length <- base::length [15:31:48.798] list <- base::list [15:31:48.798] seq.int <- base::seq.int [15:31:48.798] signalCondition <- base::signalCondition [15:31:48.798] sys.calls <- base::sys.calls [15:31:48.798] `[[` <- base::`[[` [15:31:48.798] `+` <- base::`+` [15:31:48.798] `<<-` <- base::`<<-` [15:31:48.798] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:48.798] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:48.798] 3L)] [15:31:48.798] } [15:31:48.798] function(cond) { [15:31:48.798] is_error <- inherits(cond, "error") [15:31:48.798] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:48.798] NULL) [15:31:48.798] if (is_error) { [15:31:48.798] sessionInformation <- function() { [15:31:48.798] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:48.798] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:48.798] search = base::search(), system = base::Sys.info()) [15:31:48.798] } [15:31:48.798] ...future.conditions[[length(...future.conditions) + [15:31:48.798] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:48.798] cond$call), session = sessionInformation(), [15:31:48.798] timestamp = base::Sys.time(), signaled = 0L) [15:31:48.798] signalCondition(cond) [15:31:48.798] } [15:31:48.798] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:48.798] "immediateCondition"))) { [15:31:48.798] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:48.798] ...future.conditions[[length(...future.conditions) + [15:31:48.798] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:48.798] if (TRUE && !signal) { [15:31:48.798] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.798] { [15:31:48.798] inherits <- base::inherits [15:31:48.798] invokeRestart <- base::invokeRestart [15:31:48.798] is.null <- base::is.null [15:31:48.798] muffled <- FALSE [15:31:48.798] if (inherits(cond, "message")) { [15:31:48.798] muffled <- grepl(pattern, "muffleMessage") [15:31:48.798] if (muffled) [15:31:48.798] invokeRestart("muffleMessage") [15:31:48.798] } [15:31:48.798] else if (inherits(cond, "warning")) { [15:31:48.798] muffled <- grepl(pattern, "muffleWarning") [15:31:48.798] if (muffled) [15:31:48.798] invokeRestart("muffleWarning") [15:31:48.798] } [15:31:48.798] else if (inherits(cond, "condition")) { [15:31:48.798] if (!is.null(pattern)) { [15:31:48.798] computeRestarts <- base::computeRestarts [15:31:48.798] grepl <- base::grepl [15:31:48.798] restarts <- computeRestarts(cond) [15:31:48.798] for (restart in restarts) { [15:31:48.798] name <- restart$name [15:31:48.798] if (is.null(name)) [15:31:48.798] next [15:31:48.798] if (!grepl(pattern, name)) [15:31:48.798] next [15:31:48.798] invokeRestart(restart) [15:31:48.798] muffled <- TRUE [15:31:48.798] break [15:31:48.798] } [15:31:48.798] } [15:31:48.798] } [15:31:48.798] invisible(muffled) [15:31:48.798] } [15:31:48.798] muffleCondition(cond, pattern = "^muffle") [15:31:48.798] } [15:31:48.798] } [15:31:48.798] else { [15:31:48.798] if (TRUE) { [15:31:48.798] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.798] { [15:31:48.798] inherits <- base::inherits [15:31:48.798] invokeRestart <- base::invokeRestart [15:31:48.798] is.null <- base::is.null [15:31:48.798] muffled <- FALSE [15:31:48.798] if (inherits(cond, "message")) { [15:31:48.798] muffled <- grepl(pattern, "muffleMessage") [15:31:48.798] if (muffled) [15:31:48.798] invokeRestart("muffleMessage") [15:31:48.798] } [15:31:48.798] else if (inherits(cond, "warning")) { [15:31:48.798] muffled <- grepl(pattern, "muffleWarning") [15:31:48.798] if (muffled) [15:31:48.798] invokeRestart("muffleWarning") [15:31:48.798] } [15:31:48.798] else if (inherits(cond, "condition")) { [15:31:48.798] if (!is.null(pattern)) { [15:31:48.798] computeRestarts <- base::computeRestarts [15:31:48.798] grepl <- base::grepl [15:31:48.798] restarts <- computeRestarts(cond) [15:31:48.798] for (restart in restarts) { [15:31:48.798] name <- restart$name [15:31:48.798] if (is.null(name)) [15:31:48.798] next [15:31:48.798] if (!grepl(pattern, name)) [15:31:48.798] next [15:31:48.798] invokeRestart(restart) [15:31:48.798] muffled <- TRUE [15:31:48.798] break [15:31:48.798] } [15:31:48.798] } [15:31:48.798] } [15:31:48.798] invisible(muffled) [15:31:48.798] } [15:31:48.798] muffleCondition(cond, pattern = "^muffle") [15:31:48.798] } [15:31:48.798] } [15:31:48.798] } [15:31:48.798] })) [15:31:48.798] }, error = function(ex) { [15:31:48.798] base::structure(base::list(value = NULL, visible = NULL, [15:31:48.798] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.798] ...future.rng), started = ...future.startTime, [15:31:48.798] finished = Sys.time(), session_uuid = NA_character_, [15:31:48.798] version = "1.8"), class = "FutureResult") [15:31:48.798] }, finally = { [15:31:48.798] if (!identical(...future.workdir, getwd())) [15:31:48.798] setwd(...future.workdir) [15:31:48.798] { [15:31:48.798] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:48.798] ...future.oldOptions$nwarnings <- NULL [15:31:48.798] } [15:31:48.798] base::options(...future.oldOptions) [15:31:48.798] if (.Platform$OS.type == "windows") { [15:31:48.798] old_names <- names(...future.oldEnvVars) [15:31:48.798] envs <- base::Sys.getenv() [15:31:48.798] names <- names(envs) [15:31:48.798] common <- intersect(names, old_names) [15:31:48.798] added <- setdiff(names, old_names) [15:31:48.798] removed <- setdiff(old_names, names) [15:31:48.798] changed <- common[...future.oldEnvVars[common] != [15:31:48.798] envs[common]] [15:31:48.798] NAMES <- toupper(changed) [15:31:48.798] args <- list() [15:31:48.798] for (kk in seq_along(NAMES)) { [15:31:48.798] name <- changed[[kk]] [15:31:48.798] NAME <- NAMES[[kk]] [15:31:48.798] if (name != NAME && is.element(NAME, old_names)) [15:31:48.798] next [15:31:48.798] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.798] } [15:31:48.798] NAMES <- toupper(added) [15:31:48.798] for (kk in seq_along(NAMES)) { [15:31:48.798] name <- added[[kk]] [15:31:48.798] NAME <- NAMES[[kk]] [15:31:48.798] if (name != NAME && is.element(NAME, old_names)) [15:31:48.798] next [15:31:48.798] args[[name]] <- "" [15:31:48.798] } [15:31:48.798] NAMES <- toupper(removed) [15:31:48.798] for (kk in seq_along(NAMES)) { [15:31:48.798] name <- removed[[kk]] [15:31:48.798] NAME <- NAMES[[kk]] [15:31:48.798] if (name != NAME && is.element(NAME, old_names)) [15:31:48.798] next [15:31:48.798] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.798] } [15:31:48.798] if (length(args) > 0) [15:31:48.798] base::do.call(base::Sys.setenv, args = args) [15:31:48.798] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:48.798] } [15:31:48.798] else { [15:31:48.798] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:48.798] } [15:31:48.798] { [15:31:48.798] if (base::length(...future.futureOptionsAdded) > [15:31:48.798] 0L) { [15:31:48.798] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:48.798] base::names(opts) <- ...future.futureOptionsAdded [15:31:48.798] base::options(opts) [15:31:48.798] } [15:31:48.798] { [15:31:48.798] { [15:31:48.798] NULL [15:31:48.798] RNGkind("Mersenne-Twister") [15:31:48.798] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:48.798] inherits = FALSE) [15:31:48.798] } [15:31:48.798] options(future.plan = NULL) [15:31:48.798] if (is.na(NA_character_)) [15:31:48.798] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.798] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:48.798] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:48.798] .init = FALSE) [15:31:48.798] } [15:31:48.798] } [15:31:48.798] } [15:31:48.798] }) [15:31:48.798] if (TRUE) { [15:31:48.798] base::sink(type = "output", split = FALSE) [15:31:48.798] if (TRUE) { [15:31:48.798] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:48.798] } [15:31:48.798] else { [15:31:48.798] ...future.result["stdout"] <- base::list(NULL) [15:31:48.798] } [15:31:48.798] base::close(...future.stdout) [15:31:48.798] ...future.stdout <- NULL [15:31:48.798] } [15:31:48.798] ...future.result$conditions <- ...future.conditions [15:31:48.798] ...future.result$finished <- base::Sys.time() [15:31:48.798] ...future.result [15:31:48.798] } [15:31:48.804] assign_globals() ... [15:31:48.804] List of 5 [15:31:48.804] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:48.804] $ future.call.arguments :List of 1 [15:31:48.804] ..$ length: int 2 [15:31:48.804] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:48.804] $ ...future.elements_ii :List of 1 [15:31:48.804] ..$ b: chr "numeric" [15:31:48.804] $ ...future.seeds_ii : NULL [15:31:48.804] $ ...future.globals.maxSize: NULL [15:31:48.804] - attr(*, "where")=List of 5 [15:31:48.804] ..$ ...future.FUN : [15:31:48.804] ..$ future.call.arguments : [15:31:48.804] ..$ ...future.elements_ii : [15:31:48.804] ..$ ...future.seeds_ii : [15:31:48.804] ..$ ...future.globals.maxSize: [15:31:48.804] - attr(*, "resolved")= logi FALSE [15:31:48.804] - attr(*, "total_size")= num 2240 [15:31:48.804] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:48.804] - attr(*, "already-done")= logi TRUE [15:31:48.814] - copied '...future.FUN' to environment [15:31:48.814] - copied 'future.call.arguments' to environment [15:31:48.815] - copied '...future.elements_ii' to environment [15:31:48.815] - copied '...future.seeds_ii' to environment [15:31:48.815] - copied '...future.globals.maxSize' to environment [15:31:48.815] assign_globals() ... done [15:31:48.816] plan(): Setting new future strategy stack: [15:31:48.816] List of future strategies: [15:31:48.816] 1. sequential: [15:31:48.816] - args: function (..., envir = parent.frame(), workers = "") [15:31:48.816] - tweaked: FALSE [15:31:48.816] - call: NULL [15:31:48.817] plan(): nbrOfWorkers() = 1 [15:31:48.819] plan(): Setting new future strategy stack: [15:31:48.820] List of future strategies: [15:31:48.820] 1. multisession: [15:31:48.820] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:48.820] - tweaked: FALSE [15:31:48.820] - call: plan(strategy) [15:31:48.827] plan(): nbrOfWorkers() = 1 [15:31:48.827] SequentialFuture started (and completed) [15:31:48.827] - Launch lazy future ... done [15:31:48.828] run() for 'SequentialFuture' ... done [15:31:48.828] Created future: [15:31:48.828] SequentialFuture: [15:31:48.828] Label: 'future_lapply-2' [15:31:48.828] Expression: [15:31:48.828] { [15:31:48.828] do.call(function(...) { [15:31:48.828] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.828] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.828] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.828] on.exit(options(oopts), add = TRUE) [15:31:48.828] } [15:31:48.828] { [15:31:48.828] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.828] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.828] ...future.FUN(...future.X_jj, ...) [15:31:48.828] }) [15:31:48.828] } [15:31:48.828] }, args = future.call.arguments) [15:31:48.828] } [15:31:48.828] Lazy evaluation: FALSE [15:31:48.828] Asynchronous evaluation: FALSE [15:31:48.828] Local evaluation: TRUE [15:31:48.828] Environment: R_GlobalEnv [15:31:48.828] Capture standard output: TRUE [15:31:48.828] Capture condition classes: 'condition' (excluding 'nothing') [15:31:48.828] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:48.828] Packages: [15:31:48.828] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:48.828] Resolved: TRUE [15:31:48.828] Value: 64 bytes of class 'list' [15:31:48.828] Early signaling: FALSE [15:31:48.828] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:48.828] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.830] Chunk #2 of 4 ... DONE [15:31:48.831] Chunk #3 of 4 ... [15:31:48.831] - Finding globals in 'X' for chunk #3 ... [15:31:48.831] getGlobalsAndPackages() ... [15:31:48.832] Searching for globals... [15:31:48.832] [15:31:48.832] Searching for globals ... DONE [15:31:48.833] - globals: [0] [15:31:48.833] getGlobalsAndPackages() ... DONE [15:31:48.833] + additional globals found: [n=0] [15:31:48.833] + additional namespaces needed: [n=0] [15:31:48.834] - Finding globals in 'X' for chunk #3 ... DONE [15:31:48.834] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:48.834] - seeds: [15:31:48.834] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.835] getGlobalsAndPackages() ... [15:31:48.835] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.835] Resolving globals: FALSE [15:31:48.836] Tweak future expression to call with '...' arguments ... [15:31:48.836] { [15:31:48.836] do.call(function(...) { [15:31:48.836] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.836] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.836] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.836] on.exit(options(oopts), add = TRUE) [15:31:48.836] } [15:31:48.836] { [15:31:48.836] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.836] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.836] ...future.FUN(...future.X_jj, ...) [15:31:48.836] }) [15:31:48.836] } [15:31:48.836] }, args = future.call.arguments) [15:31:48.836] } [15:31:48.837] Tweak future expression to call with '...' arguments ... DONE [15:31:48.837] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.838] [15:31:48.838] getGlobalsAndPackages() ... DONE [15:31:48.839] run() for 'Future' ... [15:31:48.839] - state: 'created' [15:31:48.839] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:48.843] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.844] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:48.844] - Field: 'label' [15:31:48.844] - Field: 'local' [15:31:48.844] - Field: 'owner' [15:31:48.845] - Field: 'envir' [15:31:48.845] - Field: 'packages' [15:31:48.845] - Field: 'gc' [15:31:48.846] - Field: 'conditions' [15:31:48.846] - Field: 'expr' [15:31:48.846] - Field: 'uuid' [15:31:48.847] - Field: 'seed' [15:31:48.847] - Field: 'version' [15:31:48.847] - Field: 'result' [15:31:48.847] - Field: 'asynchronous' [15:31:48.848] - Field: 'calls' [15:31:48.848] - Field: 'globals' [15:31:48.848] - Field: 'stdout' [15:31:48.848] - Field: 'earlySignal' [15:31:48.849] - Field: 'lazy' [15:31:48.849] - Field: 'state' [15:31:48.849] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:48.850] - Launch lazy future ... [15:31:48.850] Packages needed by the future expression (n = 0): [15:31:48.850] Packages needed by future strategies (n = 0): [15:31:48.851] { [15:31:48.851] { [15:31:48.851] { [15:31:48.851] ...future.startTime <- base::Sys.time() [15:31:48.851] { [15:31:48.851] { [15:31:48.851] { [15:31:48.851] base::local({ [15:31:48.851] has_future <- base::requireNamespace("future", [15:31:48.851] quietly = TRUE) [15:31:48.851] if (has_future) { [15:31:48.851] ns <- base::getNamespace("future") [15:31:48.851] version <- ns[[".package"]][["version"]] [15:31:48.851] if (is.null(version)) [15:31:48.851] version <- utils::packageVersion("future") [15:31:48.851] } [15:31:48.851] else { [15:31:48.851] version <- NULL [15:31:48.851] } [15:31:48.851] if (!has_future || version < "1.8.0") { [15:31:48.851] info <- base::c(r_version = base::gsub("R version ", [15:31:48.851] "", base::R.version$version.string), [15:31:48.851] platform = base::sprintf("%s (%s-bit)", [15:31:48.851] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:48.851] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:48.851] "release", "version")], collapse = " "), [15:31:48.851] hostname = base::Sys.info()[["nodename"]]) [15:31:48.851] info <- base::sprintf("%s: %s", base::names(info), [15:31:48.851] info) [15:31:48.851] info <- base::paste(info, collapse = "; ") [15:31:48.851] if (!has_future) { [15:31:48.851] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:48.851] info) [15:31:48.851] } [15:31:48.851] else { [15:31:48.851] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:48.851] info, version) [15:31:48.851] } [15:31:48.851] base::stop(msg) [15:31:48.851] } [15:31:48.851] }) [15:31:48.851] } [15:31:48.851] ...future.strategy.old <- future::plan("list") [15:31:48.851] options(future.plan = NULL) [15:31:48.851] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.851] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:48.851] } [15:31:48.851] ...future.workdir <- getwd() [15:31:48.851] } [15:31:48.851] ...future.oldOptions <- base::as.list(base::.Options) [15:31:48.851] ...future.oldEnvVars <- base::Sys.getenv() [15:31:48.851] } [15:31:48.851] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:48.851] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:48.851] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:48.851] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:48.851] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:48.851] future.stdout.windows.reencode = NULL, width = 80L) [15:31:48.851] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:48.851] base::names(...future.oldOptions)) [15:31:48.851] } [15:31:48.851] if (FALSE) { [15:31:48.851] } [15:31:48.851] else { [15:31:48.851] if (TRUE) { [15:31:48.851] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:48.851] open = "w") [15:31:48.851] } [15:31:48.851] else { [15:31:48.851] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:48.851] windows = "NUL", "/dev/null"), open = "w") [15:31:48.851] } [15:31:48.851] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:48.851] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:48.851] base::sink(type = "output", split = FALSE) [15:31:48.851] base::close(...future.stdout) [15:31:48.851] }, add = TRUE) [15:31:48.851] } [15:31:48.851] ...future.frame <- base::sys.nframe() [15:31:48.851] ...future.conditions <- base::list() [15:31:48.851] ...future.rng <- base::globalenv()$.Random.seed [15:31:48.851] if (FALSE) { [15:31:48.851] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:48.851] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:48.851] } [15:31:48.851] ...future.result <- base::tryCatch({ [15:31:48.851] base::withCallingHandlers({ [15:31:48.851] ...future.value <- base::withVisible(base::local({ [15:31:48.851] do.call(function(...) { [15:31:48.851] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.851] if (!identical(...future.globals.maxSize.org, [15:31:48.851] ...future.globals.maxSize)) { [15:31:48.851] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.851] on.exit(options(oopts), add = TRUE) [15:31:48.851] } [15:31:48.851] { [15:31:48.851] lapply(seq_along(...future.elements_ii), [15:31:48.851] FUN = function(jj) { [15:31:48.851] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.851] ...future.FUN(...future.X_jj, ...) [15:31:48.851] }) [15:31:48.851] } [15:31:48.851] }, args = future.call.arguments) [15:31:48.851] })) [15:31:48.851] future::FutureResult(value = ...future.value$value, [15:31:48.851] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.851] ...future.rng), globalenv = if (FALSE) [15:31:48.851] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:48.851] ...future.globalenv.names)) [15:31:48.851] else NULL, started = ...future.startTime, version = "1.8") [15:31:48.851] }, condition = base::local({ [15:31:48.851] c <- base::c [15:31:48.851] inherits <- base::inherits [15:31:48.851] invokeRestart <- base::invokeRestart [15:31:48.851] length <- base::length [15:31:48.851] list <- base::list [15:31:48.851] seq.int <- base::seq.int [15:31:48.851] signalCondition <- base::signalCondition [15:31:48.851] sys.calls <- base::sys.calls [15:31:48.851] `[[` <- base::`[[` [15:31:48.851] `+` <- base::`+` [15:31:48.851] `<<-` <- base::`<<-` [15:31:48.851] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:48.851] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:48.851] 3L)] [15:31:48.851] } [15:31:48.851] function(cond) { [15:31:48.851] is_error <- inherits(cond, "error") [15:31:48.851] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:48.851] NULL) [15:31:48.851] if (is_error) { [15:31:48.851] sessionInformation <- function() { [15:31:48.851] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:48.851] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:48.851] search = base::search(), system = base::Sys.info()) [15:31:48.851] } [15:31:48.851] ...future.conditions[[length(...future.conditions) + [15:31:48.851] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:48.851] cond$call), session = sessionInformation(), [15:31:48.851] timestamp = base::Sys.time(), signaled = 0L) [15:31:48.851] signalCondition(cond) [15:31:48.851] } [15:31:48.851] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:48.851] "immediateCondition"))) { [15:31:48.851] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:48.851] ...future.conditions[[length(...future.conditions) + [15:31:48.851] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:48.851] if (TRUE && !signal) { [15:31:48.851] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.851] { [15:31:48.851] inherits <- base::inherits [15:31:48.851] invokeRestart <- base::invokeRestart [15:31:48.851] is.null <- base::is.null [15:31:48.851] muffled <- FALSE [15:31:48.851] if (inherits(cond, "message")) { [15:31:48.851] muffled <- grepl(pattern, "muffleMessage") [15:31:48.851] if (muffled) [15:31:48.851] invokeRestart("muffleMessage") [15:31:48.851] } [15:31:48.851] else if (inherits(cond, "warning")) { [15:31:48.851] muffled <- grepl(pattern, "muffleWarning") [15:31:48.851] if (muffled) [15:31:48.851] invokeRestart("muffleWarning") [15:31:48.851] } [15:31:48.851] else if (inherits(cond, "condition")) { [15:31:48.851] if (!is.null(pattern)) { [15:31:48.851] computeRestarts <- base::computeRestarts [15:31:48.851] grepl <- base::grepl [15:31:48.851] restarts <- computeRestarts(cond) [15:31:48.851] for (restart in restarts) { [15:31:48.851] name <- restart$name [15:31:48.851] if (is.null(name)) [15:31:48.851] next [15:31:48.851] if (!grepl(pattern, name)) [15:31:48.851] next [15:31:48.851] invokeRestart(restart) [15:31:48.851] muffled <- TRUE [15:31:48.851] break [15:31:48.851] } [15:31:48.851] } [15:31:48.851] } [15:31:48.851] invisible(muffled) [15:31:48.851] } [15:31:48.851] muffleCondition(cond, pattern = "^muffle") [15:31:48.851] } [15:31:48.851] } [15:31:48.851] else { [15:31:48.851] if (TRUE) { [15:31:48.851] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.851] { [15:31:48.851] inherits <- base::inherits [15:31:48.851] invokeRestart <- base::invokeRestart [15:31:48.851] is.null <- base::is.null [15:31:48.851] muffled <- FALSE [15:31:48.851] if (inherits(cond, "message")) { [15:31:48.851] muffled <- grepl(pattern, "muffleMessage") [15:31:48.851] if (muffled) [15:31:48.851] invokeRestart("muffleMessage") [15:31:48.851] } [15:31:48.851] else if (inherits(cond, "warning")) { [15:31:48.851] muffled <- grepl(pattern, "muffleWarning") [15:31:48.851] if (muffled) [15:31:48.851] invokeRestart("muffleWarning") [15:31:48.851] } [15:31:48.851] else if (inherits(cond, "condition")) { [15:31:48.851] if (!is.null(pattern)) { [15:31:48.851] computeRestarts <- base::computeRestarts [15:31:48.851] grepl <- base::grepl [15:31:48.851] restarts <- computeRestarts(cond) [15:31:48.851] for (restart in restarts) { [15:31:48.851] name <- restart$name [15:31:48.851] if (is.null(name)) [15:31:48.851] next [15:31:48.851] if (!grepl(pattern, name)) [15:31:48.851] next [15:31:48.851] invokeRestart(restart) [15:31:48.851] muffled <- TRUE [15:31:48.851] break [15:31:48.851] } [15:31:48.851] } [15:31:48.851] } [15:31:48.851] invisible(muffled) [15:31:48.851] } [15:31:48.851] muffleCondition(cond, pattern = "^muffle") [15:31:48.851] } [15:31:48.851] } [15:31:48.851] } [15:31:48.851] })) [15:31:48.851] }, error = function(ex) { [15:31:48.851] base::structure(base::list(value = NULL, visible = NULL, [15:31:48.851] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.851] ...future.rng), started = ...future.startTime, [15:31:48.851] finished = Sys.time(), session_uuid = NA_character_, [15:31:48.851] version = "1.8"), class = "FutureResult") [15:31:48.851] }, finally = { [15:31:48.851] if (!identical(...future.workdir, getwd())) [15:31:48.851] setwd(...future.workdir) [15:31:48.851] { [15:31:48.851] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:48.851] ...future.oldOptions$nwarnings <- NULL [15:31:48.851] } [15:31:48.851] base::options(...future.oldOptions) [15:31:48.851] if (.Platform$OS.type == "windows") { [15:31:48.851] old_names <- names(...future.oldEnvVars) [15:31:48.851] envs <- base::Sys.getenv() [15:31:48.851] names <- names(envs) [15:31:48.851] common <- intersect(names, old_names) [15:31:48.851] added <- setdiff(names, old_names) [15:31:48.851] removed <- setdiff(old_names, names) [15:31:48.851] changed <- common[...future.oldEnvVars[common] != [15:31:48.851] envs[common]] [15:31:48.851] NAMES <- toupper(changed) [15:31:48.851] args <- list() [15:31:48.851] for (kk in seq_along(NAMES)) { [15:31:48.851] name <- changed[[kk]] [15:31:48.851] NAME <- NAMES[[kk]] [15:31:48.851] if (name != NAME && is.element(NAME, old_names)) [15:31:48.851] next [15:31:48.851] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.851] } [15:31:48.851] NAMES <- toupper(added) [15:31:48.851] for (kk in seq_along(NAMES)) { [15:31:48.851] name <- added[[kk]] [15:31:48.851] NAME <- NAMES[[kk]] [15:31:48.851] if (name != NAME && is.element(NAME, old_names)) [15:31:48.851] next [15:31:48.851] args[[name]] <- "" [15:31:48.851] } [15:31:48.851] NAMES <- toupper(removed) [15:31:48.851] for (kk in seq_along(NAMES)) { [15:31:48.851] name <- removed[[kk]] [15:31:48.851] NAME <- NAMES[[kk]] [15:31:48.851] if (name != NAME && is.element(NAME, old_names)) [15:31:48.851] next [15:31:48.851] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.851] } [15:31:48.851] if (length(args) > 0) [15:31:48.851] base::do.call(base::Sys.setenv, args = args) [15:31:48.851] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:48.851] } [15:31:48.851] else { [15:31:48.851] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:48.851] } [15:31:48.851] { [15:31:48.851] if (base::length(...future.futureOptionsAdded) > [15:31:48.851] 0L) { [15:31:48.851] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:48.851] base::names(opts) <- ...future.futureOptionsAdded [15:31:48.851] base::options(opts) [15:31:48.851] } [15:31:48.851] { [15:31:48.851] { [15:31:48.851] NULL [15:31:48.851] RNGkind("Mersenne-Twister") [15:31:48.851] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:48.851] inherits = FALSE) [15:31:48.851] } [15:31:48.851] options(future.plan = NULL) [15:31:48.851] if (is.na(NA_character_)) [15:31:48.851] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.851] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:48.851] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:48.851] .init = FALSE) [15:31:48.851] } [15:31:48.851] } [15:31:48.851] } [15:31:48.851] }) [15:31:48.851] if (TRUE) { [15:31:48.851] base::sink(type = "output", split = FALSE) [15:31:48.851] if (TRUE) { [15:31:48.851] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:48.851] } [15:31:48.851] else { [15:31:48.851] ...future.result["stdout"] <- base::list(NULL) [15:31:48.851] } [15:31:48.851] base::close(...future.stdout) [15:31:48.851] ...future.stdout <- NULL [15:31:48.851] } [15:31:48.851] ...future.result$conditions <- ...future.conditions [15:31:48.851] ...future.result$finished <- base::Sys.time() [15:31:48.851] ...future.result [15:31:48.851] } [15:31:48.857] assign_globals() ... [15:31:48.857] List of 5 [15:31:48.857] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:48.857] $ future.call.arguments :List of 1 [15:31:48.857] ..$ length: int 2 [15:31:48.857] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:48.857] $ ...future.elements_ii :List of 1 [15:31:48.857] ..$ c: chr "character" [15:31:48.857] $ ...future.seeds_ii : NULL [15:31:48.857] $ ...future.globals.maxSize: NULL [15:31:48.857] - attr(*, "where")=List of 5 [15:31:48.857] ..$ ...future.FUN : [15:31:48.857] ..$ future.call.arguments : [15:31:48.857] ..$ ...future.elements_ii : [15:31:48.857] ..$ ...future.seeds_ii : [15:31:48.857] ..$ ...future.globals.maxSize: [15:31:48.857] - attr(*, "resolved")= logi FALSE [15:31:48.857] - attr(*, "total_size")= num 2240 [15:31:48.857] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:48.857] - attr(*, "already-done")= logi TRUE [15:31:48.867] - copied '...future.FUN' to environment [15:31:48.867] - copied 'future.call.arguments' to environment [15:31:48.867] - copied '...future.elements_ii' to environment [15:31:48.868] - copied '...future.seeds_ii' to environment [15:31:48.868] - copied '...future.globals.maxSize' to environment [15:31:48.868] assign_globals() ... done [15:31:48.869] plan(): Setting new future strategy stack: [15:31:48.869] List of future strategies: [15:31:48.869] 1. sequential: [15:31:48.869] - args: function (..., envir = parent.frame(), workers = "") [15:31:48.869] - tweaked: FALSE [15:31:48.869] - call: NULL [15:31:48.870] plan(): nbrOfWorkers() = 1 [15:31:48.872] plan(): Setting new future strategy stack: [15:31:48.872] List of future strategies: [15:31:48.872] 1. multisession: [15:31:48.872] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:48.872] - tweaked: FALSE [15:31:48.872] - call: plan(strategy) [15:31:48.876] plan(): nbrOfWorkers() = 1 [15:31:48.877] SequentialFuture started (and completed) [15:31:48.877] - Launch lazy future ... done [15:31:48.877] run() for 'SequentialFuture' ... done [15:31:48.878] Created future: [15:31:48.878] SequentialFuture: [15:31:48.878] Label: 'future_lapply-3' [15:31:48.878] Expression: [15:31:48.878] { [15:31:48.878] do.call(function(...) { [15:31:48.878] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.878] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.878] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.878] on.exit(options(oopts), add = TRUE) [15:31:48.878] } [15:31:48.878] { [15:31:48.878] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.878] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.878] ...future.FUN(...future.X_jj, ...) [15:31:48.878] }) [15:31:48.878] } [15:31:48.878] }, args = future.call.arguments) [15:31:48.878] } [15:31:48.878] Lazy evaluation: FALSE [15:31:48.878] Asynchronous evaluation: FALSE [15:31:48.878] Local evaluation: TRUE [15:31:48.878] Environment: R_GlobalEnv [15:31:48.878] Capture standard output: TRUE [15:31:48.878] Capture condition classes: 'condition' (excluding 'nothing') [15:31:48.878] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 120 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:48.878] Packages: [15:31:48.878] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:48.878] Resolved: TRUE [15:31:48.878] Value: 120 bytes of class 'list' [15:31:48.878] Early signaling: FALSE [15:31:48.878] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:48.878] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.880] Chunk #3 of 4 ... DONE [15:31:48.880] Chunk #4 of 4 ... [15:31:48.881] - Finding globals in 'X' for chunk #4 ... [15:31:48.881] getGlobalsAndPackages() ... [15:31:48.881] Searching for globals... [15:31:48.882] [15:31:48.882] Searching for globals ... DONE [15:31:48.882] - globals: [0] [15:31:48.883] getGlobalsAndPackages() ... DONE [15:31:48.883] + additional globals found: [n=0] [15:31:48.883] + additional namespaces needed: [n=0] [15:31:48.884] - Finding globals in 'X' for chunk #4 ... DONE [15:31:48.884] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:48.884] - seeds: [15:31:48.884] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.885] getGlobalsAndPackages() ... [15:31:48.885] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.885] Resolving globals: FALSE [15:31:48.885] Tweak future expression to call with '...' arguments ... [15:31:48.886] { [15:31:48.886] do.call(function(...) { [15:31:48.886] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.886] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.886] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.886] on.exit(options(oopts), add = TRUE) [15:31:48.886] } [15:31:48.886] { [15:31:48.886] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.886] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.886] ...future.FUN(...future.X_jj, ...) [15:31:48.886] }) [15:31:48.886] } [15:31:48.886] }, args = future.call.arguments) [15:31:48.886] } [15:31:48.886] Tweak future expression to call with '...' arguments ... DONE [15:31:48.887] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:48.888] [15:31:48.888] getGlobalsAndPackages() ... DONE [15:31:48.888] run() for 'Future' ... [15:31:48.889] - state: 'created' [15:31:48.889] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:48.893] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.893] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:48.894] - Field: 'label' [15:31:48.894] - Field: 'local' [15:31:48.894] - Field: 'owner' [15:31:48.894] - Field: 'envir' [15:31:48.895] - Field: 'packages' [15:31:48.895] - Field: 'gc' [15:31:48.895] - Field: 'conditions' [15:31:48.896] - Field: 'expr' [15:31:48.896] - Field: 'uuid' [15:31:48.896] - Field: 'seed' [15:31:48.897] - Field: 'version' [15:31:48.897] - Field: 'result' [15:31:48.897] - Field: 'asynchronous' [15:31:48.897] - Field: 'calls' [15:31:48.898] - Field: 'globals' [15:31:48.898] - Field: 'stdout' [15:31:48.898] - Field: 'earlySignal' [15:31:48.899] - Field: 'lazy' [15:31:48.899] - Field: 'state' [15:31:48.899] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:48.899] - Launch lazy future ... [15:31:48.900] Packages needed by the future expression (n = 0): [15:31:48.900] Packages needed by future strategies (n = 0): [15:31:48.901] { [15:31:48.901] { [15:31:48.901] { [15:31:48.901] ...future.startTime <- base::Sys.time() [15:31:48.901] { [15:31:48.901] { [15:31:48.901] { [15:31:48.901] base::local({ [15:31:48.901] has_future <- base::requireNamespace("future", [15:31:48.901] quietly = TRUE) [15:31:48.901] if (has_future) { [15:31:48.901] ns <- base::getNamespace("future") [15:31:48.901] version <- ns[[".package"]][["version"]] [15:31:48.901] if (is.null(version)) [15:31:48.901] version <- utils::packageVersion("future") [15:31:48.901] } [15:31:48.901] else { [15:31:48.901] version <- NULL [15:31:48.901] } [15:31:48.901] if (!has_future || version < "1.8.0") { [15:31:48.901] info <- base::c(r_version = base::gsub("R version ", [15:31:48.901] "", base::R.version$version.string), [15:31:48.901] platform = base::sprintf("%s (%s-bit)", [15:31:48.901] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:48.901] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:48.901] "release", "version")], collapse = " "), [15:31:48.901] hostname = base::Sys.info()[["nodename"]]) [15:31:48.901] info <- base::sprintf("%s: %s", base::names(info), [15:31:48.901] info) [15:31:48.901] info <- base::paste(info, collapse = "; ") [15:31:48.901] if (!has_future) { [15:31:48.901] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:48.901] info) [15:31:48.901] } [15:31:48.901] else { [15:31:48.901] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:48.901] info, version) [15:31:48.901] } [15:31:48.901] base::stop(msg) [15:31:48.901] } [15:31:48.901] }) [15:31:48.901] } [15:31:48.901] ...future.strategy.old <- future::plan("list") [15:31:48.901] options(future.plan = NULL) [15:31:48.901] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.901] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:48.901] } [15:31:48.901] ...future.workdir <- getwd() [15:31:48.901] } [15:31:48.901] ...future.oldOptions <- base::as.list(base::.Options) [15:31:48.901] ...future.oldEnvVars <- base::Sys.getenv() [15:31:48.901] } [15:31:48.901] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:48.901] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:48.901] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:48.901] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:48.901] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:48.901] future.stdout.windows.reencode = NULL, width = 80L) [15:31:48.901] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:48.901] base::names(...future.oldOptions)) [15:31:48.901] } [15:31:48.901] if (FALSE) { [15:31:48.901] } [15:31:48.901] else { [15:31:48.901] if (TRUE) { [15:31:48.901] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:48.901] open = "w") [15:31:48.901] } [15:31:48.901] else { [15:31:48.901] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:48.901] windows = "NUL", "/dev/null"), open = "w") [15:31:48.901] } [15:31:48.901] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:48.901] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:48.901] base::sink(type = "output", split = FALSE) [15:31:48.901] base::close(...future.stdout) [15:31:48.901] }, add = TRUE) [15:31:48.901] } [15:31:48.901] ...future.frame <- base::sys.nframe() [15:31:48.901] ...future.conditions <- base::list() [15:31:48.901] ...future.rng <- base::globalenv()$.Random.seed [15:31:48.901] if (FALSE) { [15:31:48.901] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:48.901] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:48.901] } [15:31:48.901] ...future.result <- base::tryCatch({ [15:31:48.901] base::withCallingHandlers({ [15:31:48.901] ...future.value <- base::withVisible(base::local({ [15:31:48.901] do.call(function(...) { [15:31:48.901] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.901] if (!identical(...future.globals.maxSize.org, [15:31:48.901] ...future.globals.maxSize)) { [15:31:48.901] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.901] on.exit(options(oopts), add = TRUE) [15:31:48.901] } [15:31:48.901] { [15:31:48.901] lapply(seq_along(...future.elements_ii), [15:31:48.901] FUN = function(jj) { [15:31:48.901] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.901] ...future.FUN(...future.X_jj, ...) [15:31:48.901] }) [15:31:48.901] } [15:31:48.901] }, args = future.call.arguments) [15:31:48.901] })) [15:31:48.901] future::FutureResult(value = ...future.value$value, [15:31:48.901] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.901] ...future.rng), globalenv = if (FALSE) [15:31:48.901] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:48.901] ...future.globalenv.names)) [15:31:48.901] else NULL, started = ...future.startTime, version = "1.8") [15:31:48.901] }, condition = base::local({ [15:31:48.901] c <- base::c [15:31:48.901] inherits <- base::inherits [15:31:48.901] invokeRestart <- base::invokeRestart [15:31:48.901] length <- base::length [15:31:48.901] list <- base::list [15:31:48.901] seq.int <- base::seq.int [15:31:48.901] signalCondition <- base::signalCondition [15:31:48.901] sys.calls <- base::sys.calls [15:31:48.901] `[[` <- base::`[[` [15:31:48.901] `+` <- base::`+` [15:31:48.901] `<<-` <- base::`<<-` [15:31:48.901] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:48.901] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:48.901] 3L)] [15:31:48.901] } [15:31:48.901] function(cond) { [15:31:48.901] is_error <- inherits(cond, "error") [15:31:48.901] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:48.901] NULL) [15:31:48.901] if (is_error) { [15:31:48.901] sessionInformation <- function() { [15:31:48.901] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:48.901] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:48.901] search = base::search(), system = base::Sys.info()) [15:31:48.901] } [15:31:48.901] ...future.conditions[[length(...future.conditions) + [15:31:48.901] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:48.901] cond$call), session = sessionInformation(), [15:31:48.901] timestamp = base::Sys.time(), signaled = 0L) [15:31:48.901] signalCondition(cond) [15:31:48.901] } [15:31:48.901] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:48.901] "immediateCondition"))) { [15:31:48.901] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:48.901] ...future.conditions[[length(...future.conditions) + [15:31:48.901] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:48.901] if (TRUE && !signal) { [15:31:48.901] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.901] { [15:31:48.901] inherits <- base::inherits [15:31:48.901] invokeRestart <- base::invokeRestart [15:31:48.901] is.null <- base::is.null [15:31:48.901] muffled <- FALSE [15:31:48.901] if (inherits(cond, "message")) { [15:31:48.901] muffled <- grepl(pattern, "muffleMessage") [15:31:48.901] if (muffled) [15:31:48.901] invokeRestart("muffleMessage") [15:31:48.901] } [15:31:48.901] else if (inherits(cond, "warning")) { [15:31:48.901] muffled <- grepl(pattern, "muffleWarning") [15:31:48.901] if (muffled) [15:31:48.901] invokeRestart("muffleWarning") [15:31:48.901] } [15:31:48.901] else if (inherits(cond, "condition")) { [15:31:48.901] if (!is.null(pattern)) { [15:31:48.901] computeRestarts <- base::computeRestarts [15:31:48.901] grepl <- base::grepl [15:31:48.901] restarts <- computeRestarts(cond) [15:31:48.901] for (restart in restarts) { [15:31:48.901] name <- restart$name [15:31:48.901] if (is.null(name)) [15:31:48.901] next [15:31:48.901] if (!grepl(pattern, name)) [15:31:48.901] next [15:31:48.901] invokeRestart(restart) [15:31:48.901] muffled <- TRUE [15:31:48.901] break [15:31:48.901] } [15:31:48.901] } [15:31:48.901] } [15:31:48.901] invisible(muffled) [15:31:48.901] } [15:31:48.901] muffleCondition(cond, pattern = "^muffle") [15:31:48.901] } [15:31:48.901] } [15:31:48.901] else { [15:31:48.901] if (TRUE) { [15:31:48.901] muffleCondition <- function (cond, pattern = "^muffle") [15:31:48.901] { [15:31:48.901] inherits <- base::inherits [15:31:48.901] invokeRestart <- base::invokeRestart [15:31:48.901] is.null <- base::is.null [15:31:48.901] muffled <- FALSE [15:31:48.901] if (inherits(cond, "message")) { [15:31:48.901] muffled <- grepl(pattern, "muffleMessage") [15:31:48.901] if (muffled) [15:31:48.901] invokeRestart("muffleMessage") [15:31:48.901] } [15:31:48.901] else if (inherits(cond, "warning")) { [15:31:48.901] muffled <- grepl(pattern, "muffleWarning") [15:31:48.901] if (muffled) [15:31:48.901] invokeRestart("muffleWarning") [15:31:48.901] } [15:31:48.901] else if (inherits(cond, "condition")) { [15:31:48.901] if (!is.null(pattern)) { [15:31:48.901] computeRestarts <- base::computeRestarts [15:31:48.901] grepl <- base::grepl [15:31:48.901] restarts <- computeRestarts(cond) [15:31:48.901] for (restart in restarts) { [15:31:48.901] name <- restart$name [15:31:48.901] if (is.null(name)) [15:31:48.901] next [15:31:48.901] if (!grepl(pattern, name)) [15:31:48.901] next [15:31:48.901] invokeRestart(restart) [15:31:48.901] muffled <- TRUE [15:31:48.901] break [15:31:48.901] } [15:31:48.901] } [15:31:48.901] } [15:31:48.901] invisible(muffled) [15:31:48.901] } [15:31:48.901] muffleCondition(cond, pattern = "^muffle") [15:31:48.901] } [15:31:48.901] } [15:31:48.901] } [15:31:48.901] })) [15:31:48.901] }, error = function(ex) { [15:31:48.901] base::structure(base::list(value = NULL, visible = NULL, [15:31:48.901] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:48.901] ...future.rng), started = ...future.startTime, [15:31:48.901] finished = Sys.time(), session_uuid = NA_character_, [15:31:48.901] version = "1.8"), class = "FutureResult") [15:31:48.901] }, finally = { [15:31:48.901] if (!identical(...future.workdir, getwd())) [15:31:48.901] setwd(...future.workdir) [15:31:48.901] { [15:31:48.901] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:48.901] ...future.oldOptions$nwarnings <- NULL [15:31:48.901] } [15:31:48.901] base::options(...future.oldOptions) [15:31:48.901] if (.Platform$OS.type == "windows") { [15:31:48.901] old_names <- names(...future.oldEnvVars) [15:31:48.901] envs <- base::Sys.getenv() [15:31:48.901] names <- names(envs) [15:31:48.901] common <- intersect(names, old_names) [15:31:48.901] added <- setdiff(names, old_names) [15:31:48.901] removed <- setdiff(old_names, names) [15:31:48.901] changed <- common[...future.oldEnvVars[common] != [15:31:48.901] envs[common]] [15:31:48.901] NAMES <- toupper(changed) [15:31:48.901] args <- list() [15:31:48.901] for (kk in seq_along(NAMES)) { [15:31:48.901] name <- changed[[kk]] [15:31:48.901] NAME <- NAMES[[kk]] [15:31:48.901] if (name != NAME && is.element(NAME, old_names)) [15:31:48.901] next [15:31:48.901] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.901] } [15:31:48.901] NAMES <- toupper(added) [15:31:48.901] for (kk in seq_along(NAMES)) { [15:31:48.901] name <- added[[kk]] [15:31:48.901] NAME <- NAMES[[kk]] [15:31:48.901] if (name != NAME && is.element(NAME, old_names)) [15:31:48.901] next [15:31:48.901] args[[name]] <- "" [15:31:48.901] } [15:31:48.901] NAMES <- toupper(removed) [15:31:48.901] for (kk in seq_along(NAMES)) { [15:31:48.901] name <- removed[[kk]] [15:31:48.901] NAME <- NAMES[[kk]] [15:31:48.901] if (name != NAME && is.element(NAME, old_names)) [15:31:48.901] next [15:31:48.901] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:48.901] } [15:31:48.901] if (length(args) > 0) [15:31:48.901] base::do.call(base::Sys.setenv, args = args) [15:31:48.901] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:48.901] } [15:31:48.901] else { [15:31:48.901] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:48.901] } [15:31:48.901] { [15:31:48.901] if (base::length(...future.futureOptionsAdded) > [15:31:48.901] 0L) { [15:31:48.901] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:48.901] base::names(opts) <- ...future.futureOptionsAdded [15:31:48.901] base::options(opts) [15:31:48.901] } [15:31:48.901] { [15:31:48.901] { [15:31:48.901] NULL [15:31:48.901] RNGkind("Mersenne-Twister") [15:31:48.901] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:48.901] inherits = FALSE) [15:31:48.901] } [15:31:48.901] options(future.plan = NULL) [15:31:48.901] if (is.na(NA_character_)) [15:31:48.901] Sys.unsetenv("R_FUTURE_PLAN") [15:31:48.901] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:48.901] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:48.901] .init = FALSE) [15:31:48.901] } [15:31:48.901] } [15:31:48.901] } [15:31:48.901] }) [15:31:48.901] if (TRUE) { [15:31:48.901] base::sink(type = "output", split = FALSE) [15:31:48.901] if (TRUE) { [15:31:48.901] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:48.901] } [15:31:48.901] else { [15:31:48.901] ...future.result["stdout"] <- base::list(NULL) [15:31:48.901] } [15:31:48.901] base::close(...future.stdout) [15:31:48.901] ...future.stdout <- NULL [15:31:48.901] } [15:31:48.901] ...future.result$conditions <- ...future.conditions [15:31:48.901] ...future.result$finished <- base::Sys.time() [15:31:48.901] ...future.result [15:31:48.901] } [15:31:48.907] assign_globals() ... [15:31:48.907] List of 5 [15:31:48.907] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:48.907] $ future.call.arguments :List of 1 [15:31:48.907] ..$ length: int 2 [15:31:48.907] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:48.907] $ ...future.elements_ii :List of 1 [15:31:48.907] ..$ c: chr "list" [15:31:48.907] $ ...future.seeds_ii : NULL [15:31:48.907] $ ...future.globals.maxSize: NULL [15:31:48.907] - attr(*, "where")=List of 5 [15:31:48.907] ..$ ...future.FUN : [15:31:48.907] ..$ future.call.arguments : [15:31:48.907] ..$ ...future.elements_ii : [15:31:48.907] ..$ ...future.seeds_ii : [15:31:48.907] ..$ ...future.globals.maxSize: [15:31:48.907] - attr(*, "resolved")= logi FALSE [15:31:48.907] - attr(*, "total_size")= num 2240 [15:31:48.907] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:48.907] - attr(*, "already-done")= logi TRUE [15:31:48.917] - copied '...future.FUN' to environment [15:31:48.918] - copied 'future.call.arguments' to environment [15:31:48.918] - copied '...future.elements_ii' to environment [15:31:48.918] - copied '...future.seeds_ii' to environment [15:31:48.918] - copied '...future.globals.maxSize' to environment [15:31:48.919] assign_globals() ... done [15:31:48.919] plan(): Setting new future strategy stack: [15:31:48.920] List of future strategies: [15:31:48.920] 1. sequential: [15:31:48.920] - args: function (..., envir = parent.frame(), workers = "") [15:31:48.920] - tweaked: FALSE [15:31:48.920] - call: NULL [15:31:48.921] plan(): nbrOfWorkers() = 1 [15:31:48.923] plan(): Setting new future strategy stack: [15:31:48.923] List of future strategies: [15:31:48.923] 1. multisession: [15:31:48.923] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:48.923] - tweaked: FALSE [15:31:48.923] - call: plan(strategy) [15:31:48.927] plan(): nbrOfWorkers() = 1 [15:31:48.927] SequentialFuture started (and completed) [15:31:48.928] - Launch lazy future ... done [15:31:48.928] run() for 'SequentialFuture' ... done [15:31:48.928] Created future: [15:31:48.929] SequentialFuture: [15:31:48.929] Label: 'future_lapply-4' [15:31:48.929] Expression: [15:31:48.929] { [15:31:48.929] do.call(function(...) { [15:31:48.929] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:48.929] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:48.929] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:48.929] on.exit(options(oopts), add = TRUE) [15:31:48.929] } [15:31:48.929] { [15:31:48.929] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:48.929] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:48.929] ...future.FUN(...future.X_jj, ...) [15:31:48.929] }) [15:31:48.929] } [15:31:48.929] }, args = future.call.arguments) [15:31:48.929] } [15:31:48.929] Lazy evaluation: FALSE [15:31:48.929] Asynchronous evaluation: FALSE [15:31:48.929] Local evaluation: TRUE [15:31:48.929] Environment: R_GlobalEnv [15:31:48.929] Capture standard output: TRUE [15:31:48.929] Capture condition classes: 'condition' (excluding 'nothing') [15:31:48.929] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:48.929] Packages: [15:31:48.929] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:48.929] Resolved: TRUE [15:31:48.929] Value: 0 bytes of class 'list' [15:31:48.929] Early signaling: FALSE [15:31:48.929] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:48.929] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:48.931] Chunk #4 of 4 ... DONE [15:31:48.931] Launching 4 futures (chunks) ... DONE [15:31:48.931] Resolving 4 futures (chunks) ... [15:31:48.932] resolve() on list ... [15:31:48.932] recursive: 0 [15:31:48.932] length: 4 [15:31:48.932] [15:31:48.933] resolved() for 'SequentialFuture' ... [15:31:48.933] - state: 'finished' [15:31:48.933] - run: TRUE [15:31:48.934] - result: 'FutureResult' [15:31:48.934] resolved() for 'SequentialFuture' ... done [15:31:48.934] Future #1 [15:31:48.935] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:48.935] - nx: 4 [15:31:48.935] - relay: TRUE [15:31:48.935] - stdout: TRUE [15:31:48.936] - signal: TRUE [15:31:48.936] - resignal: FALSE [15:31:48.936] - force: TRUE [15:31:48.937] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [15:31:48.937] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [15:31:48.937] - until=1 [15:31:48.937] - relaying element #1 [15:31:48.938] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:48.938] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:48.938] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:48.939] length: 3 (resolved future 1) [15:31:48.939] resolved() for 'SequentialFuture' ... [15:31:48.939] - state: 'finished' [15:31:48.940] - run: TRUE [15:31:48.940] - result: 'FutureResult' [15:31:48.940] resolved() for 'SequentialFuture' ... done [15:31:48.941] Future #2 [15:31:48.941] signalConditionsASAP(SequentialFuture, pos=2) ... [15:31:48.941] - nx: 4 [15:31:48.942] - relay: TRUE [15:31:48.942] - stdout: TRUE [15:31:48.942] - signal: TRUE [15:31:48.942] - resignal: FALSE [15:31:48.943] - force: TRUE [15:31:48.943] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:48.943] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:48.943] - until=2 [15:31:48.944] - relaying element #2 [15:31:48.944] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:48.944] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:48.945] signalConditionsASAP(SequentialFuture, pos=2) ... done [15:31:48.945] length: 2 (resolved future 2) [15:31:48.945] resolved() for 'SequentialFuture' ... [15:31:48.946] - state: 'finished' [15:31:48.946] - run: TRUE [15:31:48.946] - result: 'FutureResult' [15:31:48.946] resolved() for 'SequentialFuture' ... done [15:31:48.947] Future #3 [15:31:48.947] signalConditionsASAP(SequentialFuture, pos=3) ... [15:31:48.947] - nx: 4 [15:31:48.948] - relay: TRUE [15:31:48.948] - stdout: TRUE [15:31:48.948] - signal: TRUE [15:31:48.948] - resignal: FALSE [15:31:48.949] - force: TRUE [15:31:48.949] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:48.949] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:48.949] - until=3 [15:31:48.950] - relaying element #3 [15:31:48.950] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:48.950] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:48.951] signalConditionsASAP(SequentialFuture, pos=3) ... done [15:31:48.951] length: 1 (resolved future 3) [15:31:48.951] resolved() for 'SequentialFuture' ... [15:31:48.952] - state: 'finished' [15:31:48.952] - run: TRUE [15:31:48.952] - result: 'FutureResult' [15:31:48.952] resolved() for 'SequentialFuture' ... done [15:31:48.953] Future #4 [15:31:48.953] signalConditionsASAP(SequentialFuture, pos=4) ... [15:31:48.953] - nx: 4 [15:31:48.954] - relay: TRUE [15:31:48.954] - stdout: TRUE [15:31:48.954] - signal: TRUE [15:31:48.955] - resignal: FALSE [15:31:48.955] - force: TRUE [15:31:48.955] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:48.955] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:48.956] - until=4 [15:31:48.956] - relaying element #4 [15:31:48.956] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:48.957] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:48.957] signalConditionsASAP(SequentialFuture, pos=4) ... done [15:31:48.957] length: 0 (resolved future 4) [15:31:48.957] Relaying remaining futures [15:31:48.958] signalConditionsASAP(NULL, pos=0) ... [15:31:48.958] - nx: 4 [15:31:48.958] - relay: TRUE [15:31:48.958] - stdout: TRUE [15:31:48.959] - signal: TRUE [15:31:48.959] - resignal: FALSE [15:31:48.959] - force: TRUE [15:31:48.959] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:48.960] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [15:31:48.960] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:48.960] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:48.961] signalConditionsASAP(NULL, pos=0) ... done [15:31:48.961] resolve() on list ... DONE [15:31:48.962] - Number of value chunks collected: 4 [15:31:48.962] Resolving 4 futures (chunks) ... DONE [15:31:48.962] Reducing values from 4 chunks ... [15:31:48.962] - Number of values collected after concatenation: 4 [15:31:48.963] - Number of values expected: 4 [15:31:48.963] Reducing values from 4 chunks ... DONE [15:31:48.963] 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, ...) ... [15:31:48.968] future_lapply() ... [15:31:48.985] Number of chunks: 1 [15:31:48.986] getGlobalsAndPackagesXApply() ... [15:31:48.986] - future.globals: TRUE [15:31:48.986] getGlobalsAndPackages() ... [15:31:48.986] Searching for globals... [15:31:49.003] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [15:31:49.003] Searching for globals ... DONE [15:31:49.003] Resolving globals: FALSE [15:31:49.005] The total size of the 1 globals is 69.62 KiB (71288 bytes) [15:31:49.006] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 69.62 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (69.62 KiB of class 'function') [15:31:49.006] - globals: [1] 'FUN' [15:31:49.006] - packages: [1] 'future' [15:31:49.007] getGlobalsAndPackages() ... DONE [15:31:49.007] - globals found/used: [n=1] 'FUN' [15:31:49.007] - needed namespaces: [n=1] 'future' [15:31:49.008] Finding globals ... DONE [15:31:49.008] - use_args: TRUE [15:31:49.008] - Getting '...' globals ... [15:31:49.012] resolve() on list ... [15:31:49.012] recursive: 0 [15:31:49.012] length: 1 [15:31:49.013] elements: '...' [15:31:49.013] length: 0 (resolved future 1) [15:31:49.013] resolve() on list ... DONE [15:31:49.014] - '...' content: [n=2] 'collapse', 'maxHead' [15:31:49.014] List of 1 [15:31:49.014] $ ...:List of 2 [15:31:49.014] ..$ collapse: chr "; " [15:31:49.014] ..$ maxHead : int 3 [15:31:49.014] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.014] - attr(*, "where")=List of 1 [15:31:49.014] ..$ ...: [15:31:49.014] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.014] - attr(*, "resolved")= logi TRUE [15:31:49.014] - attr(*, "total_size")= num NA [15:31:49.020] - Getting '...' globals ... DONE [15:31:49.020] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:49.021] List of 2 [15:31:49.021] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:49.021] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:49.021] $ ... :List of 2 [15:31:49.021] ..$ collapse: chr "; " [15:31:49.021] ..$ maxHead : int 3 [15:31:49.021] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.021] - attr(*, "where")=List of 2 [15:31:49.021] ..$ ...future.FUN: [15:31:49.021] ..$ ... : [15:31:49.021] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.021] - attr(*, "resolved")= logi FALSE [15:31:49.021] - attr(*, "total_size")= num 71456 [15:31:49.027] Packages to be attached in all futures: [n=1] 'future' [15:31:49.027] getGlobalsAndPackagesXApply() ... DONE [15:31:49.028] Number of futures (= number of chunks): 1 [15:31:49.028] Launching 1 futures (chunks) ... [15:31:49.028] Chunk #1 of 1 ... [15:31:49.029] - Finding globals in 'X' for chunk #1 ... [15:31:49.029] getGlobalsAndPackages() ... [15:31:49.029] Searching for globals... [15:31:49.030] [15:31:49.030] Searching for globals ... DONE [15:31:49.030] - globals: [0] [15:31:49.030] getGlobalsAndPackages() ... DONE [15:31:49.031] + additional globals found: [n=0] [15:31:49.031] + additional namespaces needed: [n=0] [15:31:49.031] - Finding globals in 'X' for chunk #1 ... DONE [15:31:49.032] - seeds: [15:31:49.032] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.032] getGlobalsAndPackages() ... [15:31:49.032] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.033] Resolving globals: FALSE [15:31:49.033] Tweak future expression to call with '...' arguments ... [15:31:49.033] { [15:31:49.033] do.call(function(...) { [15:31:49.033] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.033] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:49.033] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.033] on.exit(options(oopts), add = TRUE) [15:31:49.033] } [15:31:49.033] { [15:31:49.033] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:49.033] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.033] ...future.FUN(...future.X_jj, ...) [15:31:49.033] }) [15:31:49.033] } [15:31:49.033] }, args = future.call.arguments) [15:31:49.033] } [15:31:49.034] Tweak future expression to call with '...' arguments ... DONE [15:31:49.035] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.035] - packages: [1] 'future' [15:31:49.036] getGlobalsAndPackages() ... DONE [15:31:49.036] run() for 'Future' ... [15:31:49.036] - state: 'created' [15:31:49.037] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:49.041] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:49.041] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:49.041] - Field: 'label' [15:31:49.042] - Field: 'local' [15:31:49.042] - Field: 'owner' [15:31:49.042] - Field: 'envir' [15:31:49.042] - Field: 'packages' [15:31:49.043] - Field: 'gc' [15:31:49.043] - Field: 'conditions' [15:31:49.043] - Field: 'expr' [15:31:49.044] - Field: 'uuid' [15:31:49.044] - Field: 'seed' [15:31:49.044] - Field: 'version' [15:31:49.044] - Field: 'result' [15:31:49.045] - Field: 'asynchronous' [15:31:49.045] - Field: 'calls' [15:31:49.045] - Field: 'globals' [15:31:49.046] - Field: 'stdout' [15:31:49.046] - Field: 'earlySignal' [15:31:49.046] - Field: 'lazy' [15:31:49.047] - Field: 'state' [15:31:49.047] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:49.047] - Launch lazy future ... [15:31:49.048] Packages needed by the future expression (n = 1): 'future' [15:31:49.048] Packages needed by future strategies (n = 0): [15:31:49.049] { [15:31:49.049] { [15:31:49.049] { [15:31:49.049] ...future.startTime <- base::Sys.time() [15:31:49.049] { [15:31:49.049] { [15:31:49.049] { [15:31:49.049] { [15:31:49.049] base::local({ [15:31:49.049] has_future <- base::requireNamespace("future", [15:31:49.049] quietly = TRUE) [15:31:49.049] if (has_future) { [15:31:49.049] ns <- base::getNamespace("future") [15:31:49.049] version <- ns[[".package"]][["version"]] [15:31:49.049] if (is.null(version)) [15:31:49.049] version <- utils::packageVersion("future") [15:31:49.049] } [15:31:49.049] else { [15:31:49.049] version <- NULL [15:31:49.049] } [15:31:49.049] if (!has_future || version < "1.8.0") { [15:31:49.049] info <- base::c(r_version = base::gsub("R version ", [15:31:49.049] "", base::R.version$version.string), [15:31:49.049] platform = base::sprintf("%s (%s-bit)", [15:31:49.049] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:49.049] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:49.049] "release", "version")], collapse = " "), [15:31:49.049] hostname = base::Sys.info()[["nodename"]]) [15:31:49.049] info <- base::sprintf("%s: %s", base::names(info), [15:31:49.049] info) [15:31:49.049] info <- base::paste(info, collapse = "; ") [15:31:49.049] if (!has_future) { [15:31:49.049] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:49.049] info) [15:31:49.049] } [15:31:49.049] else { [15:31:49.049] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:49.049] info, version) [15:31:49.049] } [15:31:49.049] base::stop(msg) [15:31:49.049] } [15:31:49.049] }) [15:31:49.049] } [15:31:49.049] base::local({ [15:31:49.049] for (pkg in "future") { [15:31:49.049] base::loadNamespace(pkg) [15:31:49.049] base::library(pkg, character.only = TRUE) [15:31:49.049] } [15:31:49.049] }) [15:31:49.049] } [15:31:49.049] ...future.strategy.old <- future::plan("list") [15:31:49.049] options(future.plan = NULL) [15:31:49.049] Sys.unsetenv("R_FUTURE_PLAN") [15:31:49.049] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:49.049] } [15:31:49.049] ...future.workdir <- getwd() [15:31:49.049] } [15:31:49.049] ...future.oldOptions <- base::as.list(base::.Options) [15:31:49.049] ...future.oldEnvVars <- base::Sys.getenv() [15:31:49.049] } [15:31:49.049] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:49.049] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:49.049] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:49.049] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:49.049] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:49.049] future.stdout.windows.reencode = NULL, width = 80L) [15:31:49.049] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:49.049] base::names(...future.oldOptions)) [15:31:49.049] } [15:31:49.049] if (FALSE) { [15:31:49.049] } [15:31:49.049] else { [15:31:49.049] if (TRUE) { [15:31:49.049] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:49.049] open = "w") [15:31:49.049] } [15:31:49.049] else { [15:31:49.049] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:49.049] windows = "NUL", "/dev/null"), open = "w") [15:31:49.049] } [15:31:49.049] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:49.049] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:49.049] base::sink(type = "output", split = FALSE) [15:31:49.049] base::close(...future.stdout) [15:31:49.049] }, add = TRUE) [15:31:49.049] } [15:31:49.049] ...future.frame <- base::sys.nframe() [15:31:49.049] ...future.conditions <- base::list() [15:31:49.049] ...future.rng <- base::globalenv()$.Random.seed [15:31:49.049] if (FALSE) { [15:31:49.049] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:49.049] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:49.049] } [15:31:49.049] ...future.result <- base::tryCatch({ [15:31:49.049] base::withCallingHandlers({ [15:31:49.049] ...future.value <- base::withVisible(base::local({ [15:31:49.049] do.call(function(...) { [15:31:49.049] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.049] if (!identical(...future.globals.maxSize.org, [15:31:49.049] ...future.globals.maxSize)) { [15:31:49.049] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.049] on.exit(options(oopts), add = TRUE) [15:31:49.049] } [15:31:49.049] { [15:31:49.049] lapply(seq_along(...future.elements_ii), [15:31:49.049] FUN = function(jj) { [15:31:49.049] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.049] ...future.FUN(...future.X_jj, ...) [15:31:49.049] }) [15:31:49.049] } [15:31:49.049] }, args = future.call.arguments) [15:31:49.049] })) [15:31:49.049] future::FutureResult(value = ...future.value$value, [15:31:49.049] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:49.049] ...future.rng), globalenv = if (FALSE) [15:31:49.049] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:49.049] ...future.globalenv.names)) [15:31:49.049] else NULL, started = ...future.startTime, version = "1.8") [15:31:49.049] }, condition = base::local({ [15:31:49.049] c <- base::c [15:31:49.049] inherits <- base::inherits [15:31:49.049] invokeRestart <- base::invokeRestart [15:31:49.049] length <- base::length [15:31:49.049] list <- base::list [15:31:49.049] seq.int <- base::seq.int [15:31:49.049] signalCondition <- base::signalCondition [15:31:49.049] sys.calls <- base::sys.calls [15:31:49.049] `[[` <- base::`[[` [15:31:49.049] `+` <- base::`+` [15:31:49.049] `<<-` <- base::`<<-` [15:31:49.049] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:49.049] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:49.049] 3L)] [15:31:49.049] } [15:31:49.049] function(cond) { [15:31:49.049] is_error <- inherits(cond, "error") [15:31:49.049] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:49.049] NULL) [15:31:49.049] if (is_error) { [15:31:49.049] sessionInformation <- function() { [15:31:49.049] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:49.049] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:49.049] search = base::search(), system = base::Sys.info()) [15:31:49.049] } [15:31:49.049] ...future.conditions[[length(...future.conditions) + [15:31:49.049] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:49.049] cond$call), session = sessionInformation(), [15:31:49.049] timestamp = base::Sys.time(), signaled = 0L) [15:31:49.049] signalCondition(cond) [15:31:49.049] } [15:31:49.049] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:49.049] "immediateCondition"))) { [15:31:49.049] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:49.049] ...future.conditions[[length(...future.conditions) + [15:31:49.049] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:49.049] if (TRUE && !signal) { [15:31:49.049] muffleCondition <- function (cond, pattern = "^muffle") [15:31:49.049] { [15:31:49.049] inherits <- base::inherits [15:31:49.049] invokeRestart <- base::invokeRestart [15:31:49.049] is.null <- base::is.null [15:31:49.049] muffled <- FALSE [15:31:49.049] if (inherits(cond, "message")) { [15:31:49.049] muffled <- grepl(pattern, "muffleMessage") [15:31:49.049] if (muffled) [15:31:49.049] invokeRestart("muffleMessage") [15:31:49.049] } [15:31:49.049] else if (inherits(cond, "warning")) { [15:31:49.049] muffled <- grepl(pattern, "muffleWarning") [15:31:49.049] if (muffled) [15:31:49.049] invokeRestart("muffleWarning") [15:31:49.049] } [15:31:49.049] else if (inherits(cond, "condition")) { [15:31:49.049] if (!is.null(pattern)) { [15:31:49.049] computeRestarts <- base::computeRestarts [15:31:49.049] grepl <- base::grepl [15:31:49.049] restarts <- computeRestarts(cond) [15:31:49.049] for (restart in restarts) { [15:31:49.049] name <- restart$name [15:31:49.049] if (is.null(name)) [15:31:49.049] next [15:31:49.049] if (!grepl(pattern, name)) [15:31:49.049] next [15:31:49.049] invokeRestart(restart) [15:31:49.049] muffled <- TRUE [15:31:49.049] break [15:31:49.049] } [15:31:49.049] } [15:31:49.049] } [15:31:49.049] invisible(muffled) [15:31:49.049] } [15:31:49.049] muffleCondition(cond, pattern = "^muffle") [15:31:49.049] } [15:31:49.049] } [15:31:49.049] else { [15:31:49.049] if (TRUE) { [15:31:49.049] muffleCondition <- function (cond, pattern = "^muffle") [15:31:49.049] { [15:31:49.049] inherits <- base::inherits [15:31:49.049] invokeRestart <- base::invokeRestart [15:31:49.049] is.null <- base::is.null [15:31:49.049] muffled <- FALSE [15:31:49.049] if (inherits(cond, "message")) { [15:31:49.049] muffled <- grepl(pattern, "muffleMessage") [15:31:49.049] if (muffled) [15:31:49.049] invokeRestart("muffleMessage") [15:31:49.049] } [15:31:49.049] else if (inherits(cond, "warning")) { [15:31:49.049] muffled <- grepl(pattern, "muffleWarning") [15:31:49.049] if (muffled) [15:31:49.049] invokeRestart("muffleWarning") [15:31:49.049] } [15:31:49.049] else if (inherits(cond, "condition")) { [15:31:49.049] if (!is.null(pattern)) { [15:31:49.049] computeRestarts <- base::computeRestarts [15:31:49.049] grepl <- base::grepl [15:31:49.049] restarts <- computeRestarts(cond) [15:31:49.049] for (restart in restarts) { [15:31:49.049] name <- restart$name [15:31:49.049] if (is.null(name)) [15:31:49.049] next [15:31:49.049] if (!grepl(pattern, name)) [15:31:49.049] next [15:31:49.049] invokeRestart(restart) [15:31:49.049] muffled <- TRUE [15:31:49.049] break [15:31:49.049] } [15:31:49.049] } [15:31:49.049] } [15:31:49.049] invisible(muffled) [15:31:49.049] } [15:31:49.049] muffleCondition(cond, pattern = "^muffle") [15:31:49.049] } [15:31:49.049] } [15:31:49.049] } [15:31:49.049] })) [15:31:49.049] }, error = function(ex) { [15:31:49.049] base::structure(base::list(value = NULL, visible = NULL, [15:31:49.049] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:49.049] ...future.rng), started = ...future.startTime, [15:31:49.049] finished = Sys.time(), session_uuid = NA_character_, [15:31:49.049] version = "1.8"), class = "FutureResult") [15:31:49.049] }, finally = { [15:31:49.049] if (!identical(...future.workdir, getwd())) [15:31:49.049] setwd(...future.workdir) [15:31:49.049] { [15:31:49.049] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:49.049] ...future.oldOptions$nwarnings <- NULL [15:31:49.049] } [15:31:49.049] base::options(...future.oldOptions) [15:31:49.049] if (.Platform$OS.type == "windows") { [15:31:49.049] old_names <- names(...future.oldEnvVars) [15:31:49.049] envs <- base::Sys.getenv() [15:31:49.049] names <- names(envs) [15:31:49.049] common <- intersect(names, old_names) [15:31:49.049] added <- setdiff(names, old_names) [15:31:49.049] removed <- setdiff(old_names, names) [15:31:49.049] changed <- common[...future.oldEnvVars[common] != [15:31:49.049] envs[common]] [15:31:49.049] NAMES <- toupper(changed) [15:31:49.049] args <- list() [15:31:49.049] for (kk in seq_along(NAMES)) { [15:31:49.049] name <- changed[[kk]] [15:31:49.049] NAME <- NAMES[[kk]] [15:31:49.049] if (name != NAME && is.element(NAME, old_names)) [15:31:49.049] next [15:31:49.049] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:49.049] } [15:31:49.049] NAMES <- toupper(added) [15:31:49.049] for (kk in seq_along(NAMES)) { [15:31:49.049] name <- added[[kk]] [15:31:49.049] NAME <- NAMES[[kk]] [15:31:49.049] if (name != NAME && is.element(NAME, old_names)) [15:31:49.049] next [15:31:49.049] args[[name]] <- "" [15:31:49.049] } [15:31:49.049] NAMES <- toupper(removed) [15:31:49.049] for (kk in seq_along(NAMES)) { [15:31:49.049] name <- removed[[kk]] [15:31:49.049] NAME <- NAMES[[kk]] [15:31:49.049] if (name != NAME && is.element(NAME, old_names)) [15:31:49.049] next [15:31:49.049] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:49.049] } [15:31:49.049] if (length(args) > 0) [15:31:49.049] base::do.call(base::Sys.setenv, args = args) [15:31:49.049] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:49.049] } [15:31:49.049] else { [15:31:49.049] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:49.049] } [15:31:49.049] { [15:31:49.049] if (base::length(...future.futureOptionsAdded) > [15:31:49.049] 0L) { [15:31:49.049] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:49.049] base::names(opts) <- ...future.futureOptionsAdded [15:31:49.049] base::options(opts) [15:31:49.049] } [15:31:49.049] { [15:31:49.049] { [15:31:49.049] NULL [15:31:49.049] RNGkind("Mersenne-Twister") [15:31:49.049] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:49.049] inherits = FALSE) [15:31:49.049] } [15:31:49.049] options(future.plan = NULL) [15:31:49.049] if (is.na(NA_character_)) [15:31:49.049] Sys.unsetenv("R_FUTURE_PLAN") [15:31:49.049] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:49.049] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:49.049] .init = FALSE) [15:31:49.049] } [15:31:49.049] } [15:31:49.049] } [15:31:49.049] }) [15:31:49.049] if (TRUE) { [15:31:49.049] base::sink(type = "output", split = FALSE) [15:31:49.049] if (TRUE) { [15:31:49.049] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:49.049] } [15:31:49.049] else { [15:31:49.049] ...future.result["stdout"] <- base::list(NULL) [15:31:49.049] } [15:31:49.049] base::close(...future.stdout) [15:31:49.049] ...future.stdout <- NULL [15:31:49.049] } [15:31:49.049] ...future.result$conditions <- ...future.conditions [15:31:49.049] ...future.result$finished <- base::Sys.time() [15:31:49.049] ...future.result [15:31:49.049] } [15:31:49.056] assign_globals() ... [15:31:49.056] List of 5 [15:31:49.056] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:49.056] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:49.056] $ future.call.arguments :List of 2 [15:31:49.056] ..$ collapse: chr "; " [15:31:49.056] ..$ maxHead : int 3 [15:31:49.056] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.056] $ ...future.elements_ii :List of 1 [15:31:49.056] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [15:31:49.056] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [15:31:49.056] $ ...future.seeds_ii : NULL [15:31:49.056] $ ...future.globals.maxSize: NULL [15:31:49.056] - attr(*, "where")=List of 5 [15:31:49.056] ..$ ...future.FUN : [15:31:49.056] ..$ future.call.arguments : [15:31:49.056] ..$ ...future.elements_ii : [15:31:49.056] ..$ ...future.seeds_ii : [15:31:49.056] ..$ ...future.globals.maxSize: [15:31:49.056] - attr(*, "resolved")= logi FALSE [15:31:49.056] - attr(*, "total_size")= num 71456 [15:31:49.056] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.056] - attr(*, "already-done")= logi TRUE [15:31:49.067] - copied '...future.FUN' to environment [15:31:49.068] - copied 'future.call.arguments' to environment [15:31:49.068] - copied '...future.elements_ii' to environment [15:31:49.068] - copied '...future.seeds_ii' to environment [15:31:49.068] - copied '...future.globals.maxSize' to environment [15:31:49.069] assign_globals() ... done [15:31:49.070] plan(): Setting new future strategy stack: [15:31:49.070] List of future strategies: [15:31:49.070] 1. sequential: [15:31:49.070] - args: function (..., envir = parent.frame(), workers = "") [15:31:49.070] - tweaked: FALSE [15:31:49.070] - call: NULL [15:31:49.071] plan(): nbrOfWorkers() = 1 [15:31:49.073] plan(): Setting new future strategy stack: [15:31:49.073] List of future strategies: [15:31:49.073] 1. multisession: [15:31:49.073] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:49.073] - tweaked: FALSE [15:31:49.073] - call: plan(strategy) [15:31:49.076] plan(): nbrOfWorkers() = 1 [15:31:49.076] SequentialFuture started (and completed) [15:31:49.076] - Launch lazy future ... done [15:31:49.077] run() for 'SequentialFuture' ... done [15:31:49.077] Created future: [15:31:49.077] SequentialFuture: [15:31:49.077] Label: 'future_lapply-1' [15:31:49.077] Expression: [15:31:49.077] { [15:31:49.077] do.call(function(...) { [15:31:49.077] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.077] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:49.077] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.077] on.exit(options(oopts), add = TRUE) [15:31:49.077] } [15:31:49.077] { [15:31:49.077] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:49.077] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.077] ...future.FUN(...future.X_jj, ...) [15:31:49.077] }) [15:31:49.077] } [15:31:49.077] }, args = future.call.arguments) [15:31:49.077] } [15:31:49.077] Lazy evaluation: FALSE [15:31:49.077] Asynchronous evaluation: FALSE [15:31:49.077] Local evaluation: TRUE [15:31:49.077] Environment: R_GlobalEnv [15:31:49.077] Capture standard output: TRUE [15:31:49.077] Capture condition classes: 'condition' (excluding 'nothing') [15:31:49.077] Globals: 5 objects totaling 82.61 KiB (function '...future.FUN' of 69.62 KiB, DotDotDotList 'future.call.arguments' of 168 bytes, list '...future.elements_ii' of 12.83 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:49.077] Packages: 1 packages ('future') [15:31:49.077] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:49.077] Resolved: TRUE [15:31:49.077] Value: 136 bytes of class 'list' [15:31:49.077] Early signaling: FALSE [15:31:49.077] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:49.077] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:49.079] Chunk #1 of 1 ... DONE [15:31:49.079] Launching 1 futures (chunks) ... DONE [15:31:49.079] Resolving 1 futures (chunks) ... [15:31:49.079] resolve() on list ... [15:31:49.079] recursive: 0 [15:31:49.080] length: 1 [15:31:49.080] [15:31:49.080] resolved() for 'SequentialFuture' ... [15:31:49.080] - state: 'finished' [15:31:49.080] - run: TRUE [15:31:49.081] - result: 'FutureResult' [15:31:49.081] resolved() for 'SequentialFuture' ... done [15:31:49.081] Future #1 [15:31:49.081] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:49.081] - nx: 1 [15:31:49.082] - relay: TRUE [15:31:49.082] - stdout: TRUE [15:31:49.082] - signal: TRUE [15:31:49.082] - resignal: FALSE [15:31:49.082] - force: TRUE [15:31:49.082] - relayed: [n=1] FALSE [15:31:49.083] - queued futures: [n=1] FALSE [15:31:49.083] - until=1 [15:31:49.083] - relaying element #1 [15:31:49.083] - relayed: [n=1] TRUE [15:31:49.083] - queued futures: [n=1] TRUE [15:31:49.084] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:49.084] length: 0 (resolved future 1) [15:31:49.084] Relaying remaining futures [15:31:49.084] signalConditionsASAP(NULL, pos=0) ... [15:31:49.084] - nx: 1 [15:31:49.085] - relay: TRUE [15:31:49.085] - stdout: TRUE [15:31:49.085] - signal: TRUE [15:31:49.085] - resignal: FALSE [15:31:49.085] - force: TRUE [15:31:49.085] - relayed: [n=1] TRUE [15:31:49.085] - queued futures: [n=1] TRUE - flush all [15:31:49.086] - relayed: [n=1] TRUE [15:31:49.086] - queued futures: [n=1] TRUE [15:31:49.086] signalConditionsASAP(NULL, pos=0) ... done [15:31:49.086] resolve() on list ... DONE [15:31:49.086] - Number of value chunks collected: 1 [15:31:49.087] Resolving 1 futures (chunks) ... DONE [15:31:49.087] Reducing values from 1 chunks ... [15:31:49.087] - Number of values collected after concatenation: 1 [15:31:49.087] - Number of values expected: 1 [15:31:49.087] Reducing values from 1 chunks ... DONE [15:31:49.088] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [15:31:49.089] future_lapply() ... [15:31:49.092] Number of chunks: 2 [15:31:49.092] getGlobalsAndPackagesXApply() ... [15:31:49.093] - future.globals: TRUE [15:31:49.093] getGlobalsAndPackages() ... [15:31:49.093] Searching for globals... [15:31:49.095] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [15:31:49.095] Searching for globals ... DONE [15:31:49.095] Resolving globals: FALSE [15:31:49.096] The total size of the 1 globals is 4.85 KiB (4968 bytes) [15:31:49.096] The total size of the 1 globals exported for future expression ('FUN()') is 4.85 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (4.85 KiB of class 'function') [15:31:49.096] - globals: [1] 'FUN' [15:31:49.096] - packages: [1] 'listenv' [15:31:49.097] getGlobalsAndPackages() ... DONE [15:31:49.097] - globals found/used: [n=1] 'FUN' [15:31:49.097] - needed namespaces: [n=1] 'listenv' [15:31:49.097] Finding globals ... DONE [15:31:49.097] - use_args: TRUE [15:31:49.097] - Getting '...' globals ... [15:31:49.098] resolve() on list ... [15:31:49.098] recursive: 0 [15:31:49.098] length: 1 [15:31:49.098] elements: '...' [15:31:49.099] length: 0 (resolved future 1) [15:31:49.099] resolve() on list ... DONE [15:31:49.099] - '...' content: [n=0] [15:31:49.099] List of 1 [15:31:49.099] $ ...: list() [15:31:49.099] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.099] - attr(*, "where")=List of 1 [15:31:49.099] ..$ ...: [15:31:49.099] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.099] - attr(*, "resolved")= logi TRUE [15:31:49.099] - attr(*, "total_size")= num NA [15:31:49.102] - Getting '...' globals ... DONE [15:31:49.103] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:49.103] List of 2 [15:31:49.103] $ ...future.FUN:function (x, ...) [15:31:49.103] $ ... : list() [15:31:49.103] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.103] - attr(*, "where")=List of 2 [15:31:49.103] ..$ ...future.FUN: [15:31:49.103] ..$ ... : [15:31:49.103] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.103] - attr(*, "resolved")= logi FALSE [15:31:49.103] - attr(*, "total_size")= num 4968 [15:31:49.106] Packages to be attached in all futures: [n=1] 'listenv' [15:31:49.106] getGlobalsAndPackagesXApply() ... DONE [15:31:49.107] Number of futures (= number of chunks): 2 [15:31:49.107] Launching 2 futures (chunks) ... [15:31:49.107] Chunk #1 of 2 ... [15:31:49.107] - Finding globals in 'X' for chunk #1 ... [15:31:49.108] getGlobalsAndPackages() ... [15:31:49.108] Searching for globals... [15:31:49.108] [15:31:49.109] Searching for globals ... DONE [15:31:49.109] - globals: [0] [15:31:49.109] getGlobalsAndPackages() ... DONE [15:31:49.109] + additional globals found: [n=0] [15:31:49.109] + additional namespaces needed: [n=0] [15:31:49.109] - Finding globals in 'X' for chunk #1 ... DONE [15:31:49.110] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:49.110] - seeds: [15:31:49.110] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.110] getGlobalsAndPackages() ... [15:31:49.110] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.111] Resolving globals: FALSE [15:31:49.111] Tweak future expression to call with '...' arguments ... [15:31:49.111] { [15:31:49.111] do.call(function(...) { [15:31:49.111] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.111] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:49.111] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.111] on.exit(options(oopts), add = TRUE) [15:31:49.111] } [15:31:49.111] { [15:31:49.111] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:49.111] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.111] ...future.FUN(...future.X_jj, ...) [15:31:49.111] }) [15:31:49.111] } [15:31:49.111] }, args = future.call.arguments) [15:31:49.111] } [15:31:49.111] Tweak future expression to call with '...' arguments ... DONE [15:31:49.112] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.112] - packages: [1] 'listenv' [15:31:49.112] getGlobalsAndPackages() ... DONE [15:31:49.113] run() for 'Future' ... [15:31:49.113] - state: 'created' [15:31:49.113] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:49.116] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:49.116] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:49.116] - Field: 'label' [15:31:49.117] - Field: 'local' [15:31:49.117] - Field: 'owner' [15:31:49.117] - Field: 'envir' [15:31:49.117] - Field: 'packages' [15:31:49.117] - Field: 'gc' [15:31:49.117] - Field: 'conditions' [15:31:49.118] - Field: 'expr' [15:31:49.118] - Field: 'uuid' [15:31:49.118] - Field: 'seed' [15:31:49.118] - Field: 'version' [15:31:49.118] - Field: 'result' [15:31:49.119] - Field: 'asynchronous' [15:31:49.119] - Field: 'calls' [15:31:49.119] - Field: 'globals' [15:31:49.119] - Field: 'stdout' [15:31:49.119] - Field: 'earlySignal' [15:31:49.119] - Field: 'lazy' [15:31:49.120] - Field: 'state' [15:31:49.120] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:49.120] - Launch lazy future ... [15:31:49.120] Packages needed by the future expression (n = 1): 'listenv' [15:31:49.120] Packages needed by future strategies (n = 0): [15:31:49.121] { [15:31:49.121] { [15:31:49.121] { [15:31:49.121] ...future.startTime <- base::Sys.time() [15:31:49.121] { [15:31:49.121] { [15:31:49.121] { [15:31:49.121] { [15:31:49.121] base::local({ [15:31:49.121] has_future <- base::requireNamespace("future", [15:31:49.121] quietly = TRUE) [15:31:49.121] if (has_future) { [15:31:49.121] ns <- base::getNamespace("future") [15:31:49.121] version <- ns[[".package"]][["version"]] [15:31:49.121] if (is.null(version)) [15:31:49.121] version <- utils::packageVersion("future") [15:31:49.121] } [15:31:49.121] else { [15:31:49.121] version <- NULL [15:31:49.121] } [15:31:49.121] if (!has_future || version < "1.8.0") { [15:31:49.121] info <- base::c(r_version = base::gsub("R version ", [15:31:49.121] "", base::R.version$version.string), [15:31:49.121] platform = base::sprintf("%s (%s-bit)", [15:31:49.121] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:49.121] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:49.121] "release", "version")], collapse = " "), [15:31:49.121] hostname = base::Sys.info()[["nodename"]]) [15:31:49.121] info <- base::sprintf("%s: %s", base::names(info), [15:31:49.121] info) [15:31:49.121] info <- base::paste(info, collapse = "; ") [15:31:49.121] if (!has_future) { [15:31:49.121] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:49.121] info) [15:31:49.121] } [15:31:49.121] else { [15:31:49.121] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:49.121] info, version) [15:31:49.121] } [15:31:49.121] base::stop(msg) [15:31:49.121] } [15:31:49.121] }) [15:31:49.121] } [15:31:49.121] base::local({ [15:31:49.121] for (pkg in "listenv") { [15:31:49.121] base::loadNamespace(pkg) [15:31:49.121] base::library(pkg, character.only = TRUE) [15:31:49.121] } [15:31:49.121] }) [15:31:49.121] } [15:31:49.121] ...future.strategy.old <- future::plan("list") [15:31:49.121] options(future.plan = NULL) [15:31:49.121] Sys.unsetenv("R_FUTURE_PLAN") [15:31:49.121] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:49.121] } [15:31:49.121] ...future.workdir <- getwd() [15:31:49.121] } [15:31:49.121] ...future.oldOptions <- base::as.list(base::.Options) [15:31:49.121] ...future.oldEnvVars <- base::Sys.getenv() [15:31:49.121] } [15:31:49.121] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:49.121] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:49.121] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:49.121] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:49.121] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:49.121] future.stdout.windows.reencode = NULL, width = 80L) [15:31:49.121] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:49.121] base::names(...future.oldOptions)) [15:31:49.121] } [15:31:49.121] if (FALSE) { [15:31:49.121] } [15:31:49.121] else { [15:31:49.121] if (TRUE) { [15:31:49.121] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:49.121] open = "w") [15:31:49.121] } [15:31:49.121] else { [15:31:49.121] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:49.121] windows = "NUL", "/dev/null"), open = "w") [15:31:49.121] } [15:31:49.121] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:49.121] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:49.121] base::sink(type = "output", split = FALSE) [15:31:49.121] base::close(...future.stdout) [15:31:49.121] }, add = TRUE) [15:31:49.121] } [15:31:49.121] ...future.frame <- base::sys.nframe() [15:31:49.121] ...future.conditions <- base::list() [15:31:49.121] ...future.rng <- base::globalenv()$.Random.seed [15:31:49.121] if (FALSE) { [15:31:49.121] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:49.121] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:49.121] } [15:31:49.121] ...future.result <- base::tryCatch({ [15:31:49.121] base::withCallingHandlers({ [15:31:49.121] ...future.value <- base::withVisible(base::local({ [15:31:49.121] do.call(function(...) { [15:31:49.121] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.121] if (!identical(...future.globals.maxSize.org, [15:31:49.121] ...future.globals.maxSize)) { [15:31:49.121] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.121] on.exit(options(oopts), add = TRUE) [15:31:49.121] } [15:31:49.121] { [15:31:49.121] lapply(seq_along(...future.elements_ii), [15:31:49.121] FUN = function(jj) { [15:31:49.121] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.121] ...future.FUN(...future.X_jj, ...) [15:31:49.121] }) [15:31:49.121] } [15:31:49.121] }, args = future.call.arguments) [15:31:49.121] })) [15:31:49.121] future::FutureResult(value = ...future.value$value, [15:31:49.121] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:49.121] ...future.rng), globalenv = if (FALSE) [15:31:49.121] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:49.121] ...future.globalenv.names)) [15:31:49.121] else NULL, started = ...future.startTime, version = "1.8") [15:31:49.121] }, condition = base::local({ [15:31:49.121] c <- base::c [15:31:49.121] inherits <- base::inherits [15:31:49.121] invokeRestart <- base::invokeRestart [15:31:49.121] length <- base::length [15:31:49.121] list <- base::list [15:31:49.121] seq.int <- base::seq.int [15:31:49.121] signalCondition <- base::signalCondition [15:31:49.121] sys.calls <- base::sys.calls [15:31:49.121] `[[` <- base::`[[` [15:31:49.121] `+` <- base::`+` [15:31:49.121] `<<-` <- base::`<<-` [15:31:49.121] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:49.121] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:49.121] 3L)] [15:31:49.121] } [15:31:49.121] function(cond) { [15:31:49.121] is_error <- inherits(cond, "error") [15:31:49.121] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:49.121] NULL) [15:31:49.121] if (is_error) { [15:31:49.121] sessionInformation <- function() { [15:31:49.121] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:49.121] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:49.121] search = base::search(), system = base::Sys.info()) [15:31:49.121] } [15:31:49.121] ...future.conditions[[length(...future.conditions) + [15:31:49.121] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:49.121] cond$call), session = sessionInformation(), [15:31:49.121] timestamp = base::Sys.time(), signaled = 0L) [15:31:49.121] signalCondition(cond) [15:31:49.121] } [15:31:49.121] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:49.121] "immediateCondition"))) { [15:31:49.121] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:49.121] ...future.conditions[[length(...future.conditions) + [15:31:49.121] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:49.121] if (TRUE && !signal) { [15:31:49.121] muffleCondition <- function (cond, pattern = "^muffle") [15:31:49.121] { [15:31:49.121] inherits <- base::inherits [15:31:49.121] invokeRestart <- base::invokeRestart [15:31:49.121] is.null <- base::is.null [15:31:49.121] muffled <- FALSE [15:31:49.121] if (inherits(cond, "message")) { [15:31:49.121] muffled <- grepl(pattern, "muffleMessage") [15:31:49.121] if (muffled) [15:31:49.121] invokeRestart("muffleMessage") [15:31:49.121] } [15:31:49.121] else if (inherits(cond, "warning")) { [15:31:49.121] muffled <- grepl(pattern, "muffleWarning") [15:31:49.121] if (muffled) [15:31:49.121] invokeRestart("muffleWarning") [15:31:49.121] } [15:31:49.121] else if (inherits(cond, "condition")) { [15:31:49.121] if (!is.null(pattern)) { [15:31:49.121] computeRestarts <- base::computeRestarts [15:31:49.121] grepl <- base::grepl [15:31:49.121] restarts <- computeRestarts(cond) [15:31:49.121] for (restart in restarts) { [15:31:49.121] name <- restart$name [15:31:49.121] if (is.null(name)) [15:31:49.121] next [15:31:49.121] if (!grepl(pattern, name)) [15:31:49.121] next [15:31:49.121] invokeRestart(restart) [15:31:49.121] muffled <- TRUE [15:31:49.121] break [15:31:49.121] } [15:31:49.121] } [15:31:49.121] } [15:31:49.121] invisible(muffled) [15:31:49.121] } [15:31:49.121] muffleCondition(cond, pattern = "^muffle") [15:31:49.121] } [15:31:49.121] } [15:31:49.121] else { [15:31:49.121] if (TRUE) { [15:31:49.121] muffleCondition <- function (cond, pattern = "^muffle") [15:31:49.121] { [15:31:49.121] inherits <- base::inherits [15:31:49.121] invokeRestart <- base::invokeRestart [15:31:49.121] is.null <- base::is.null [15:31:49.121] muffled <- FALSE [15:31:49.121] if (inherits(cond, "message")) { [15:31:49.121] muffled <- grepl(pattern, "muffleMessage") [15:31:49.121] if (muffled) [15:31:49.121] invokeRestart("muffleMessage") [15:31:49.121] } [15:31:49.121] else if (inherits(cond, "warning")) { [15:31:49.121] muffled <- grepl(pattern, "muffleWarning") [15:31:49.121] if (muffled) [15:31:49.121] invokeRestart("muffleWarning") [15:31:49.121] } [15:31:49.121] else if (inherits(cond, "condition")) { [15:31:49.121] if (!is.null(pattern)) { [15:31:49.121] computeRestarts <- base::computeRestarts [15:31:49.121] grepl <- base::grepl [15:31:49.121] restarts <- computeRestarts(cond) [15:31:49.121] for (restart in restarts) { [15:31:49.121] name <- restart$name [15:31:49.121] if (is.null(name)) [15:31:49.121] next [15:31:49.121] if (!grepl(pattern, name)) [15:31:49.121] next [15:31:49.121] invokeRestart(restart) [15:31:49.121] muffled <- TRUE [15:31:49.121] break [15:31:49.121] } [15:31:49.121] } [15:31:49.121] } [15:31:49.121] invisible(muffled) [15:31:49.121] } [15:31:49.121] muffleCondition(cond, pattern = "^muffle") [15:31:49.121] } [15:31:49.121] } [15:31:49.121] } [15:31:49.121] })) [15:31:49.121] }, error = function(ex) { [15:31:49.121] base::structure(base::list(value = NULL, visible = NULL, [15:31:49.121] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:49.121] ...future.rng), started = ...future.startTime, [15:31:49.121] finished = Sys.time(), session_uuid = NA_character_, [15:31:49.121] version = "1.8"), class = "FutureResult") [15:31:49.121] }, finally = { [15:31:49.121] if (!identical(...future.workdir, getwd())) [15:31:49.121] setwd(...future.workdir) [15:31:49.121] { [15:31:49.121] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:49.121] ...future.oldOptions$nwarnings <- NULL [15:31:49.121] } [15:31:49.121] base::options(...future.oldOptions) [15:31:49.121] if (.Platform$OS.type == "windows") { [15:31:49.121] old_names <- names(...future.oldEnvVars) [15:31:49.121] envs <- base::Sys.getenv() [15:31:49.121] names <- names(envs) [15:31:49.121] common <- intersect(names, old_names) [15:31:49.121] added <- setdiff(names, old_names) [15:31:49.121] removed <- setdiff(old_names, names) [15:31:49.121] changed <- common[...future.oldEnvVars[common] != [15:31:49.121] envs[common]] [15:31:49.121] NAMES <- toupper(changed) [15:31:49.121] args <- list() [15:31:49.121] for (kk in seq_along(NAMES)) { [15:31:49.121] name <- changed[[kk]] [15:31:49.121] NAME <- NAMES[[kk]] [15:31:49.121] if (name != NAME && is.element(NAME, old_names)) [15:31:49.121] next [15:31:49.121] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:49.121] } [15:31:49.121] NAMES <- toupper(added) [15:31:49.121] for (kk in seq_along(NAMES)) { [15:31:49.121] name <- added[[kk]] [15:31:49.121] NAME <- NAMES[[kk]] [15:31:49.121] if (name != NAME && is.element(NAME, old_names)) [15:31:49.121] next [15:31:49.121] args[[name]] <- "" [15:31:49.121] } [15:31:49.121] NAMES <- toupper(removed) [15:31:49.121] for (kk in seq_along(NAMES)) { [15:31:49.121] name <- removed[[kk]] [15:31:49.121] NAME <- NAMES[[kk]] [15:31:49.121] if (name != NAME && is.element(NAME, old_names)) [15:31:49.121] next [15:31:49.121] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:49.121] } [15:31:49.121] if (length(args) > 0) [15:31:49.121] base::do.call(base::Sys.setenv, args = args) [15:31:49.121] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:49.121] } [15:31:49.121] else { [15:31:49.121] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:49.121] } [15:31:49.121] { [15:31:49.121] if (base::length(...future.futureOptionsAdded) > [15:31:49.121] 0L) { [15:31:49.121] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:49.121] base::names(opts) <- ...future.futureOptionsAdded [15:31:49.121] base::options(opts) [15:31:49.121] } [15:31:49.121] { [15:31:49.121] { [15:31:49.121] NULL [15:31:49.121] RNGkind("Mersenne-Twister") [15:31:49.121] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:49.121] inherits = FALSE) [15:31:49.121] } [15:31:49.121] options(future.plan = NULL) [15:31:49.121] if (is.na(NA_character_)) [15:31:49.121] Sys.unsetenv("R_FUTURE_PLAN") [15:31:49.121] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:49.121] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:49.121] .init = FALSE) [15:31:49.121] } [15:31:49.121] } [15:31:49.121] } [15:31:49.121] }) [15:31:49.121] if (TRUE) { [15:31:49.121] base::sink(type = "output", split = FALSE) [15:31:49.121] if (TRUE) { [15:31:49.121] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:49.121] } [15:31:49.121] else { [15:31:49.121] ...future.result["stdout"] <- base::list(NULL) [15:31:49.121] } [15:31:49.121] base::close(...future.stdout) [15:31:49.121] ...future.stdout <- NULL [15:31:49.121] } [15:31:49.121] ...future.result$conditions <- ...future.conditions [15:31:49.121] ...future.result$finished <- base::Sys.time() [15:31:49.121] ...future.result [15:31:49.121] } [15:31:49.126] assign_globals() ... [15:31:49.127] List of 5 [15:31:49.127] $ ...future.FUN :function (x, ...) [15:31:49.127] $ future.call.arguments : list() [15:31:49.127] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.127] $ ...future.elements_ii :List of 1 [15:31:49.127] ..$ a:Classes 'listenv', 'environment' [15:31:49.127] $ ...future.seeds_ii : NULL [15:31:49.127] $ ...future.globals.maxSize: NULL [15:31:49.127] - attr(*, "where")=List of 5 [15:31:49.127] ..$ ...future.FUN : [15:31:49.127] ..$ future.call.arguments : [15:31:49.127] ..$ ...future.elements_ii : [15:31:49.127] ..$ ...future.seeds_ii : [15:31:49.127] ..$ ...future.globals.maxSize: [15:31:49.127] - attr(*, "resolved")= logi FALSE [15:31:49.127] - attr(*, "total_size")= num 4968 [15:31:49.127] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.127] - attr(*, "already-done")= logi TRUE [15:31:49.136] - copied '...future.FUN' to environment [15:31:49.136] - copied 'future.call.arguments' to environment [15:31:49.137] - copied '...future.elements_ii' to environment [15:31:49.137] - copied '...future.seeds_ii' to environment [15:31:49.137] - copied '...future.globals.maxSize' to environment [15:31:49.138] assign_globals() ... done [15:31:49.138] plan(): Setting new future strategy stack: [15:31:49.138] List of future strategies: [15:31:49.138] 1. sequential: [15:31:49.138] - args: function (..., envir = parent.frame(), workers = "") [15:31:49.138] - tweaked: FALSE [15:31:49.138] - call: NULL [15:31:49.139] plan(): nbrOfWorkers() = 1 [15:31:49.141] plan(): Setting new future strategy stack: [15:31:49.142] List of future strategies: [15:31:49.142] 1. multisession: [15:31:49.142] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:49.142] - tweaked: FALSE [15:31:49.142] - call: plan(strategy) [15:31:49.146] plan(): nbrOfWorkers() = 1 [15:31:49.146] SequentialFuture started (and completed) [15:31:49.147] - Launch lazy future ... done [15:31:49.147] run() for 'SequentialFuture' ... done [15:31:49.147] Created future: [15:31:49.148] SequentialFuture: [15:31:49.148] Label: 'future_lapply-1' [15:31:49.148] Expression: [15:31:49.148] { [15:31:49.148] do.call(function(...) { [15:31:49.148] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.148] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:49.148] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.148] on.exit(options(oopts), add = TRUE) [15:31:49.148] } [15:31:49.148] { [15:31:49.148] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:49.148] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.148] ...future.FUN(...future.X_jj, ...) [15:31:49.148] }) [15:31:49.148] } [15:31:49.148] }, args = future.call.arguments) [15:31:49.148] } [15:31:49.148] Lazy evaluation: FALSE [15:31:49.148] Asynchronous evaluation: FALSE [15:31:49.148] Local evaluation: TRUE [15:31:49.148] Environment: R_GlobalEnv [15:31:49.148] Capture standard output: TRUE [15:31:49.148] Capture condition classes: 'condition' (excluding 'nothing') [15:31:49.148] Globals: 5 objects totaling 4.96 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:49.148] Packages: 1 packages ('listenv') [15:31:49.148] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:49.148] Resolved: TRUE [15:31:49.148] Value: 336 bytes of class 'list' [15:31:49.148] Early signaling: FALSE [15:31:49.148] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:49.148] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:49.151] Chunk #1 of 2 ... DONE [15:31:49.151] Chunk #2 of 2 ... [15:31:49.152] - Finding globals in 'X' for chunk #2 ... [15:31:49.152] getGlobalsAndPackages() ... [15:31:49.153] Searching for globals... [15:31:49.154] [15:31:49.154] Searching for globals ... DONE [15:31:49.154] - globals: [0] [15:31:49.155] getGlobalsAndPackages() ... DONE [15:31:49.155] + additional globals found: [n=0] [15:31:49.155] + additional namespaces needed: [n=0] [15:31:49.156] - Finding globals in 'X' for chunk #2 ... DONE [15:31:49.156] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:49.156] - seeds: [15:31:49.156] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.157] getGlobalsAndPackages() ... [15:31:49.157] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.157] Resolving globals: FALSE [15:31:49.158] Tweak future expression to call with '...' arguments ... [15:31:49.158] { [15:31:49.158] do.call(function(...) { [15:31:49.158] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.158] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:49.158] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.158] on.exit(options(oopts), add = TRUE) [15:31:49.158] } [15:31:49.158] { [15:31:49.158] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:49.158] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.158] ...future.FUN(...future.X_jj, ...) [15:31:49.158] }) [15:31:49.158] } [15:31:49.158] }, args = future.call.arguments) [15:31:49.158] } [15:31:49.159] Tweak future expression to call with '...' arguments ... DONE [15:31:49.160] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.160] - packages: [1] 'listenv' [15:31:49.161] getGlobalsAndPackages() ... DONE [15:31:49.161] run() for 'Future' ... [15:31:49.162] - state: 'created' [15:31:49.162] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:49.167] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:49.167] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:49.167] - Field: 'label' [15:31:49.168] - Field: 'local' [15:31:49.168] - Field: 'owner' [15:31:49.168] - Field: 'envir' [15:31:49.169] - Field: 'packages' [15:31:49.169] - Field: 'gc' [15:31:49.169] - Field: 'conditions' [15:31:49.170] - Field: 'expr' [15:31:49.170] - Field: 'uuid' [15:31:49.170] - Field: 'seed' [15:31:49.171] - Field: 'version' [15:31:49.171] - Field: 'result' [15:31:49.171] - Field: 'asynchronous' [15:31:49.171] - Field: 'calls' [15:31:49.172] - Field: 'globals' [15:31:49.172] - Field: 'stdout' [15:31:49.172] - Field: 'earlySignal' [15:31:49.173] - Field: 'lazy' [15:31:49.173] - Field: 'state' [15:31:49.173] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:49.174] - Launch lazy future ... [15:31:49.174] Packages needed by the future expression (n = 1): 'listenv' [15:31:49.175] Packages needed by future strategies (n = 0): [15:31:49.176] { [15:31:49.176] { [15:31:49.176] { [15:31:49.176] ...future.startTime <- base::Sys.time() [15:31:49.176] { [15:31:49.176] { [15:31:49.176] { [15:31:49.176] { [15:31:49.176] base::local({ [15:31:49.176] has_future <- base::requireNamespace("future", [15:31:49.176] quietly = TRUE) [15:31:49.176] if (has_future) { [15:31:49.176] ns <- base::getNamespace("future") [15:31:49.176] version <- ns[[".package"]][["version"]] [15:31:49.176] if (is.null(version)) [15:31:49.176] version <- utils::packageVersion("future") [15:31:49.176] } [15:31:49.176] else { [15:31:49.176] version <- NULL [15:31:49.176] } [15:31:49.176] if (!has_future || version < "1.8.0") { [15:31:49.176] info <- base::c(r_version = base::gsub("R version ", [15:31:49.176] "", base::R.version$version.string), [15:31:49.176] platform = base::sprintf("%s (%s-bit)", [15:31:49.176] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:49.176] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:49.176] "release", "version")], collapse = " "), [15:31:49.176] hostname = base::Sys.info()[["nodename"]]) [15:31:49.176] info <- base::sprintf("%s: %s", base::names(info), [15:31:49.176] info) [15:31:49.176] info <- base::paste(info, collapse = "; ") [15:31:49.176] if (!has_future) { [15:31:49.176] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:49.176] info) [15:31:49.176] } [15:31:49.176] else { [15:31:49.176] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:49.176] info, version) [15:31:49.176] } [15:31:49.176] base::stop(msg) [15:31:49.176] } [15:31:49.176] }) [15:31:49.176] } [15:31:49.176] base::local({ [15:31:49.176] for (pkg in "listenv") { [15:31:49.176] base::loadNamespace(pkg) [15:31:49.176] base::library(pkg, character.only = TRUE) [15:31:49.176] } [15:31:49.176] }) [15:31:49.176] } [15:31:49.176] ...future.strategy.old <- future::plan("list") [15:31:49.176] options(future.plan = NULL) [15:31:49.176] Sys.unsetenv("R_FUTURE_PLAN") [15:31:49.176] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:49.176] } [15:31:49.176] ...future.workdir <- getwd() [15:31:49.176] } [15:31:49.176] ...future.oldOptions <- base::as.list(base::.Options) [15:31:49.176] ...future.oldEnvVars <- base::Sys.getenv() [15:31:49.176] } [15:31:49.176] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:49.176] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:49.176] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:49.176] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:49.176] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:49.176] future.stdout.windows.reencode = NULL, width = 80L) [15:31:49.176] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:49.176] base::names(...future.oldOptions)) [15:31:49.176] } [15:31:49.176] if (FALSE) { [15:31:49.176] } [15:31:49.176] else { [15:31:49.176] if (TRUE) { [15:31:49.176] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:49.176] open = "w") [15:31:49.176] } [15:31:49.176] else { [15:31:49.176] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:49.176] windows = "NUL", "/dev/null"), open = "w") [15:31:49.176] } [15:31:49.176] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:49.176] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:49.176] base::sink(type = "output", split = FALSE) [15:31:49.176] base::close(...future.stdout) [15:31:49.176] }, add = TRUE) [15:31:49.176] } [15:31:49.176] ...future.frame <- base::sys.nframe() [15:31:49.176] ...future.conditions <- base::list() [15:31:49.176] ...future.rng <- base::globalenv()$.Random.seed [15:31:49.176] if (FALSE) { [15:31:49.176] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:49.176] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:49.176] } [15:31:49.176] ...future.result <- base::tryCatch({ [15:31:49.176] base::withCallingHandlers({ [15:31:49.176] ...future.value <- base::withVisible(base::local({ [15:31:49.176] do.call(function(...) { [15:31:49.176] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.176] if (!identical(...future.globals.maxSize.org, [15:31:49.176] ...future.globals.maxSize)) { [15:31:49.176] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.176] on.exit(options(oopts), add = TRUE) [15:31:49.176] } [15:31:49.176] { [15:31:49.176] lapply(seq_along(...future.elements_ii), [15:31:49.176] FUN = function(jj) { [15:31:49.176] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.176] ...future.FUN(...future.X_jj, ...) [15:31:49.176] }) [15:31:49.176] } [15:31:49.176] }, args = future.call.arguments) [15:31:49.176] })) [15:31:49.176] future::FutureResult(value = ...future.value$value, [15:31:49.176] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:49.176] ...future.rng), globalenv = if (FALSE) [15:31:49.176] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:49.176] ...future.globalenv.names)) [15:31:49.176] else NULL, started = ...future.startTime, version = "1.8") [15:31:49.176] }, condition = base::local({ [15:31:49.176] c <- base::c [15:31:49.176] inherits <- base::inherits [15:31:49.176] invokeRestart <- base::invokeRestart [15:31:49.176] length <- base::length [15:31:49.176] list <- base::list [15:31:49.176] seq.int <- base::seq.int [15:31:49.176] signalCondition <- base::signalCondition [15:31:49.176] sys.calls <- base::sys.calls [15:31:49.176] `[[` <- base::`[[` [15:31:49.176] `+` <- base::`+` [15:31:49.176] `<<-` <- base::`<<-` [15:31:49.176] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:49.176] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:49.176] 3L)] [15:31:49.176] } [15:31:49.176] function(cond) { [15:31:49.176] is_error <- inherits(cond, "error") [15:31:49.176] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:49.176] NULL) [15:31:49.176] if (is_error) { [15:31:49.176] sessionInformation <- function() { [15:31:49.176] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:49.176] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:49.176] search = base::search(), system = base::Sys.info()) [15:31:49.176] } [15:31:49.176] ...future.conditions[[length(...future.conditions) + [15:31:49.176] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:49.176] cond$call), session = sessionInformation(), [15:31:49.176] timestamp = base::Sys.time(), signaled = 0L) [15:31:49.176] signalCondition(cond) [15:31:49.176] } [15:31:49.176] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:49.176] "immediateCondition"))) { [15:31:49.176] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:49.176] ...future.conditions[[length(...future.conditions) + [15:31:49.176] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:49.176] if (TRUE && !signal) { [15:31:49.176] muffleCondition <- function (cond, pattern = "^muffle") [15:31:49.176] { [15:31:49.176] inherits <- base::inherits [15:31:49.176] invokeRestart <- base::invokeRestart [15:31:49.176] is.null <- base::is.null [15:31:49.176] muffled <- FALSE [15:31:49.176] if (inherits(cond, "message")) { [15:31:49.176] muffled <- grepl(pattern, "muffleMessage") [15:31:49.176] if (muffled) [15:31:49.176] invokeRestart("muffleMessage") [15:31:49.176] } [15:31:49.176] else if (inherits(cond, "warning")) { [15:31:49.176] muffled <- grepl(pattern, "muffleWarning") [15:31:49.176] if (muffled) [15:31:49.176] invokeRestart("muffleWarning") [15:31:49.176] } [15:31:49.176] else if (inherits(cond, "condition")) { [15:31:49.176] if (!is.null(pattern)) { [15:31:49.176] computeRestarts <- base::computeRestarts [15:31:49.176] grepl <- base::grepl [15:31:49.176] restarts <- computeRestarts(cond) [15:31:49.176] for (restart in restarts) { [15:31:49.176] name <- restart$name [15:31:49.176] if (is.null(name)) [15:31:49.176] next [15:31:49.176] if (!grepl(pattern, name)) [15:31:49.176] next [15:31:49.176] invokeRestart(restart) [15:31:49.176] muffled <- TRUE [15:31:49.176] break [15:31:49.176] } [15:31:49.176] } [15:31:49.176] } [15:31:49.176] invisible(muffled) [15:31:49.176] } [15:31:49.176] muffleCondition(cond, pattern = "^muffle") [15:31:49.176] } [15:31:49.176] } [15:31:49.176] else { [15:31:49.176] if (TRUE) { [15:31:49.176] muffleCondition <- function (cond, pattern = "^muffle") [15:31:49.176] { [15:31:49.176] inherits <- base::inherits [15:31:49.176] invokeRestart <- base::invokeRestart [15:31:49.176] is.null <- base::is.null [15:31:49.176] muffled <- FALSE [15:31:49.176] if (inherits(cond, "message")) { [15:31:49.176] muffled <- grepl(pattern, "muffleMessage") [15:31:49.176] if (muffled) [15:31:49.176] invokeRestart("muffleMessage") [15:31:49.176] } [15:31:49.176] else if (inherits(cond, "warning")) { [15:31:49.176] muffled <- grepl(pattern, "muffleWarning") [15:31:49.176] if (muffled) [15:31:49.176] invokeRestart("muffleWarning") [15:31:49.176] } [15:31:49.176] else if (inherits(cond, "condition")) { [15:31:49.176] if (!is.null(pattern)) { [15:31:49.176] computeRestarts <- base::computeRestarts [15:31:49.176] grepl <- base::grepl [15:31:49.176] restarts <- computeRestarts(cond) [15:31:49.176] for (restart in restarts) { [15:31:49.176] name <- restart$name [15:31:49.176] if (is.null(name)) [15:31:49.176] next [15:31:49.176] if (!grepl(pattern, name)) [15:31:49.176] next [15:31:49.176] invokeRestart(restart) [15:31:49.176] muffled <- TRUE [15:31:49.176] break [15:31:49.176] } [15:31:49.176] } [15:31:49.176] } [15:31:49.176] invisible(muffled) [15:31:49.176] } [15:31:49.176] muffleCondition(cond, pattern = "^muffle") [15:31:49.176] } [15:31:49.176] } [15:31:49.176] } [15:31:49.176] })) [15:31:49.176] }, error = function(ex) { [15:31:49.176] base::structure(base::list(value = NULL, visible = NULL, [15:31:49.176] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:49.176] ...future.rng), started = ...future.startTime, [15:31:49.176] finished = Sys.time(), session_uuid = NA_character_, [15:31:49.176] version = "1.8"), class = "FutureResult") [15:31:49.176] }, finally = { [15:31:49.176] if (!identical(...future.workdir, getwd())) [15:31:49.176] setwd(...future.workdir) [15:31:49.176] { [15:31:49.176] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:49.176] ...future.oldOptions$nwarnings <- NULL [15:31:49.176] } [15:31:49.176] base::options(...future.oldOptions) [15:31:49.176] if (.Platform$OS.type == "windows") { [15:31:49.176] old_names <- names(...future.oldEnvVars) [15:31:49.176] envs <- base::Sys.getenv() [15:31:49.176] names <- names(envs) [15:31:49.176] common <- intersect(names, old_names) [15:31:49.176] added <- setdiff(names, old_names) [15:31:49.176] removed <- setdiff(old_names, names) [15:31:49.176] changed <- common[...future.oldEnvVars[common] != [15:31:49.176] envs[common]] [15:31:49.176] NAMES <- toupper(changed) [15:31:49.176] args <- list() [15:31:49.176] for (kk in seq_along(NAMES)) { [15:31:49.176] name <- changed[[kk]] [15:31:49.176] NAME <- NAMES[[kk]] [15:31:49.176] if (name != NAME && is.element(NAME, old_names)) [15:31:49.176] next [15:31:49.176] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:49.176] } [15:31:49.176] NAMES <- toupper(added) [15:31:49.176] for (kk in seq_along(NAMES)) { [15:31:49.176] name <- added[[kk]] [15:31:49.176] NAME <- NAMES[[kk]] [15:31:49.176] if (name != NAME && is.element(NAME, old_names)) [15:31:49.176] next [15:31:49.176] args[[name]] <- "" [15:31:49.176] } [15:31:49.176] NAMES <- toupper(removed) [15:31:49.176] for (kk in seq_along(NAMES)) { [15:31:49.176] name <- removed[[kk]] [15:31:49.176] NAME <- NAMES[[kk]] [15:31:49.176] if (name != NAME && is.element(NAME, old_names)) [15:31:49.176] next [15:31:49.176] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:49.176] } [15:31:49.176] if (length(args) > 0) [15:31:49.176] base::do.call(base::Sys.setenv, args = args) [15:31:49.176] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:49.176] } [15:31:49.176] else { [15:31:49.176] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:49.176] } [15:31:49.176] { [15:31:49.176] if (base::length(...future.futureOptionsAdded) > [15:31:49.176] 0L) { [15:31:49.176] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:49.176] base::names(opts) <- ...future.futureOptionsAdded [15:31:49.176] base::options(opts) [15:31:49.176] } [15:31:49.176] { [15:31:49.176] { [15:31:49.176] NULL [15:31:49.176] RNGkind("Mersenne-Twister") [15:31:49.176] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:49.176] inherits = FALSE) [15:31:49.176] } [15:31:49.176] options(future.plan = NULL) [15:31:49.176] if (is.na(NA_character_)) [15:31:49.176] Sys.unsetenv("R_FUTURE_PLAN") [15:31:49.176] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:49.176] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:49.176] .init = FALSE) [15:31:49.176] } [15:31:49.176] } [15:31:49.176] } [15:31:49.176] }) [15:31:49.176] if (TRUE) { [15:31:49.176] base::sink(type = "output", split = FALSE) [15:31:49.176] if (TRUE) { [15:31:49.176] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:49.176] } [15:31:49.176] else { [15:31:49.176] ...future.result["stdout"] <- base::list(NULL) [15:31:49.176] } [15:31:49.176] base::close(...future.stdout) [15:31:49.176] ...future.stdout <- NULL [15:31:49.176] } [15:31:49.176] ...future.result$conditions <- ...future.conditions [15:31:49.176] ...future.result$finished <- base::Sys.time() [15:31:49.176] ...future.result [15:31:49.176] } [15:31:49.183] assign_globals() ... [15:31:49.184] List of 5 [15:31:49.184] $ ...future.FUN :function (x, ...) [15:31:49.184] $ future.call.arguments : list() [15:31:49.184] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.184] $ ...future.elements_ii :List of 1 [15:31:49.184] ..$ b:Classes 'listenv', 'environment' [15:31:49.184] $ ...future.seeds_ii : NULL [15:31:49.184] $ ...future.globals.maxSize: NULL [15:31:49.184] - attr(*, "where")=List of 5 [15:31:49.184] ..$ ...future.FUN : [15:31:49.184] ..$ future.call.arguments : [15:31:49.184] ..$ ...future.elements_ii : [15:31:49.184] ..$ ...future.seeds_ii : [15:31:49.184] ..$ ...future.globals.maxSize: [15:31:49.184] - attr(*, "resolved")= logi FALSE [15:31:49.184] - attr(*, "total_size")= num 4968 [15:31:49.184] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.184] - attr(*, "already-done")= logi TRUE [15:31:49.200] - copied '...future.FUN' to environment [15:31:49.200] - copied 'future.call.arguments' to environment [15:31:49.200] - copied '...future.elements_ii' to environment [15:31:49.201] - copied '...future.seeds_ii' to environment [15:31:49.201] - copied '...future.globals.maxSize' to environment [15:31:49.201] assign_globals() ... done [15:31:49.202] plan(): Setting new future strategy stack: [15:31:49.203] List of future strategies: [15:31:49.203] 1. sequential: [15:31:49.203] - args: function (..., envir = parent.frame(), workers = "") [15:31:49.203] - tweaked: FALSE [15:31:49.203] - call: NULL [15:31:49.204] plan(): nbrOfWorkers() = 1 [15:31:49.206] plan(): Setting new future strategy stack: [15:31:49.207] List of future strategies: [15:31:49.207] 1. multisession: [15:31:49.207] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:49.207] - tweaked: FALSE [15:31:49.207] - call: plan(strategy) [15:31:49.211] plan(): nbrOfWorkers() = 1 [15:31:49.211] SequentialFuture started (and completed) [15:31:49.212] - Launch lazy future ... done [15:31:49.212] run() for 'SequentialFuture' ... done [15:31:49.212] Created future: [15:31:49.213] SequentialFuture: [15:31:49.213] Label: 'future_lapply-2' [15:31:49.213] Expression: [15:31:49.213] { [15:31:49.213] do.call(function(...) { [15:31:49.213] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.213] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:49.213] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.213] on.exit(options(oopts), add = TRUE) [15:31:49.213] } [15:31:49.213] { [15:31:49.213] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:49.213] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.213] ...future.FUN(...future.X_jj, ...) [15:31:49.213] }) [15:31:49.213] } [15:31:49.213] }, args = future.call.arguments) [15:31:49.213] } [15:31:49.213] Lazy evaluation: FALSE [15:31:49.213] Asynchronous evaluation: FALSE [15:31:49.213] Local evaluation: TRUE [15:31:49.213] Environment: R_GlobalEnv [15:31:49.213] Capture standard output: TRUE [15:31:49.213] Capture condition classes: 'condition' (excluding 'nothing') [15:31:49.213] Globals: 5 objects totaling 17.79 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 12.94 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:49.213] Packages: 1 packages ('listenv') [15:31:49.213] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:49.213] Resolved: TRUE [15:31:49.213] Value: 464 bytes of class 'list' [15:31:49.213] Early signaling: FALSE [15:31:49.213] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:49.213] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:49.215] Chunk #2 of 2 ... DONE [15:31:49.215] Launching 2 futures (chunks) ... DONE [15:31:49.216] Resolving 2 futures (chunks) ... [15:31:49.216] resolve() on list ... [15:31:49.216] recursive: 0 [15:31:49.217] length: 2 [15:31:49.217] [15:31:49.217] resolved() for 'SequentialFuture' ... [15:31:49.217] - state: 'finished' [15:31:49.218] - run: TRUE [15:31:49.218] - result: 'FutureResult' [15:31:49.218] resolved() for 'SequentialFuture' ... done [15:31:49.219] Future #1 [15:31:49.219] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:49.219] - nx: 2 [15:31:49.220] - relay: TRUE [15:31:49.220] - stdout: TRUE [15:31:49.220] - signal: TRUE [15:31:49.220] - resignal: FALSE [15:31:49.221] - force: TRUE [15:31:49.221] - relayed: [n=2] FALSE, FALSE [15:31:49.221] - queued futures: [n=2] FALSE, FALSE [15:31:49.221] - until=1 [15:31:49.222] - relaying element #1 [15:31:49.222] - relayed: [n=2] TRUE, FALSE [15:31:49.223] - queued futures: [n=2] TRUE, FALSE [15:31:49.223] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:49.223] length: 1 (resolved future 1) [15:31:49.223] resolved() for 'SequentialFuture' ... [15:31:49.224] - state: 'finished' [15:31:49.224] - run: TRUE [15:31:49.224] - result: 'FutureResult' [15:31:49.225] resolved() for 'SequentialFuture' ... done [15:31:49.225] Future #2 [15:31:49.225] signalConditionsASAP(SequentialFuture, pos=2) ... [15:31:49.226] - nx: 2 [15:31:49.226] - relay: TRUE [15:31:49.226] - stdout: TRUE [15:31:49.226] - signal: TRUE [15:31:49.227] - resignal: FALSE [15:31:49.227] - force: TRUE [15:31:49.227] - relayed: [n=2] TRUE, FALSE [15:31:49.227] - queued futures: [n=2] TRUE, FALSE [15:31:49.228] - until=2 [15:31:49.228] - relaying element #2 [15:31:49.228] - relayed: [n=2] TRUE, TRUE [15:31:49.229] - queued futures: [n=2] TRUE, TRUE [15:31:49.229] signalConditionsASAP(SequentialFuture, pos=2) ... done [15:31:49.229] length: 0 (resolved future 2) [15:31:49.230] Relaying remaining futures [15:31:49.230] signalConditionsASAP(NULL, pos=0) ... [15:31:49.230] - nx: 2 [15:31:49.230] - relay: TRUE [15:31:49.231] - stdout: TRUE [15:31:49.231] - signal: TRUE [15:31:49.231] - resignal: FALSE [15:31:49.231] - force: TRUE [15:31:49.232] - relayed: [n=2] TRUE, TRUE [15:31:49.232] - queued futures: [n=2] TRUE, TRUE - flush all [15:31:49.232] - relayed: [n=2] TRUE, TRUE [15:31:49.233] - queued futures: [n=2] TRUE, TRUE [15:31:49.233] signalConditionsASAP(NULL, pos=0) ... done [15:31:49.233] resolve() on list ... DONE [15:31:49.234] - Number of value chunks collected: 2 [15:31:49.234] Resolving 2 futures (chunks) ... DONE [15:31:49.234] Reducing values from 2 chunks ... [15:31:49.235] - Number of values collected after concatenation: 2 [15:31:49.235] - Number of values expected: 2 [15:31:49.235] Reducing values from 2 chunks ... DONE [15:31:49.235] 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, ...) ... [15:31:49.239] future_lapply() ... [15:31:49.244] Number of chunks: 1 [15:31:49.245] getGlobalsAndPackagesXApply() ... [15:31:49.245] - future.globals: TRUE [15:31:49.245] getGlobalsAndPackages() ... [15:31:49.246] Searching for globals... [15:31:49.248] - globals found: [2] 'FUN', '.Internal' [15:31:49.249] Searching for globals ... DONE [15:31:49.249] Resolving globals: FALSE [15:31:49.250] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:49.251] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:49.252] - globals: [1] 'FUN' [15:31:49.252] [15:31:49.252] getGlobalsAndPackages() ... DONE [15:31:49.253] - globals found/used: [n=1] 'FUN' [15:31:49.253] - needed namespaces: [n=0] [15:31:49.253] Finding globals ... DONE [15:31:49.254] - use_args: TRUE [15:31:49.254] - Getting '...' globals ... [15:31:49.255] resolve() on list ... [15:31:49.255] recursive: 0 [15:31:49.255] length: 1 [15:31:49.255] elements: '...' [15:31:49.256] length: 0 (resolved future 1) [15:31:49.256] resolve() on list ... DONE [15:31:49.256] - '...' content: [n=1] 'length' [15:31:49.257] List of 1 [15:31:49.257] $ ...:List of 1 [15:31:49.257] ..$ length: int 2 [15:31:49.257] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.257] - attr(*, "where")=List of 1 [15:31:49.257] ..$ ...: [15:31:49.257] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.257] - attr(*, "resolved")= logi TRUE [15:31:49.257] - attr(*, "total_size")= num NA [15:31:49.263] - Getting '...' globals ... DONE [15:31:49.264] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:49.264] List of 2 [15:31:49.264] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:49.264] $ ... :List of 1 [15:31:49.264] ..$ length: int 2 [15:31:49.264] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.264] - attr(*, "where")=List of 2 [15:31:49.264] ..$ ...future.FUN: [15:31:49.264] ..$ ... : [15:31:49.264] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.264] - attr(*, "resolved")= logi FALSE [15:31:49.264] - attr(*, "total_size")= num 2240 [15:31:49.270] Packages to be attached in all futures: [n=0] [15:31:49.271] getGlobalsAndPackagesXApply() ... DONE [15:31:49.271] Number of futures (= number of chunks): 1 [15:31:49.272] Launching 1 futures (chunks) ... [15:31:49.272] Chunk #1 of 1 ... [15:31:49.272] - Finding globals in 'X' for chunk #1 ... [15:31:49.273] getGlobalsAndPackages() ... [15:31:49.273] Searching for globals... [15:31:49.273] [15:31:49.274] Searching for globals ... DONE [15:31:49.274] - globals: [0] [15:31:49.274] getGlobalsAndPackages() ... DONE [15:31:49.275] + additional globals found: [n=0] [15:31:49.275] + additional namespaces needed: [n=0] [15:31:49.275] - Finding globals in 'X' for chunk #1 ... DONE [15:31:49.275] - seeds: [15:31:49.276] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.276] getGlobalsAndPackages() ... [15:31:49.276] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.277] Resolving globals: FALSE [15:31:49.277] Tweak future expression to call with '...' arguments ... [15:31:49.277] { [15:31:49.277] do.call(function(...) { [15:31:49.277] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.277] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:49.277] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.277] on.exit(options(oopts), add = TRUE) [15:31:49.277] } [15:31:49.277] { [15:31:49.277] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:49.277] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.277] ...future.FUN(...future.X_jj, ...) [15:31:49.277] }) [15:31:49.277] } [15:31:49.277] }, args = future.call.arguments) [15:31:49.277] } [15:31:49.278] Tweak future expression to call with '...' arguments ... DONE [15:31:49.279] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.279] [15:31:49.279] getGlobalsAndPackages() ... DONE [15:31:49.280] run() for 'Future' ... [15:31:49.281] - state: 'created' [15:31:49.281] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:49.285] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:49.286] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:49.286] - Field: 'label' [15:31:49.286] - Field: 'local' [15:31:49.286] - Field: 'owner' [15:31:49.287] - Field: 'envir' [15:31:49.287] - Field: 'packages' [15:31:49.287] - Field: 'gc' [15:31:49.287] - Field: 'conditions' [15:31:49.287] - Field: 'expr' [15:31:49.287] - Field: 'uuid' [15:31:49.288] - Field: 'seed' [15:31:49.288] - Field: 'version' [15:31:49.288] - Field: 'result' [15:31:49.288] - Field: 'asynchronous' [15:31:49.288] - Field: 'calls' [15:31:49.289] - Field: 'globals' [15:31:49.289] - Field: 'stdout' [15:31:49.289] - Field: 'earlySignal' [15:31:49.289] - Field: 'lazy' [15:31:49.289] - Field: 'state' [15:31:49.289] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:49.290] - Launch lazy future ... [15:31:49.290] Packages needed by the future expression (n = 0): [15:31:49.290] Packages needed by future strategies (n = 0): [15:31:49.291] { [15:31:49.291] { [15:31:49.291] { [15:31:49.291] ...future.startTime <- base::Sys.time() [15:31:49.291] { [15:31:49.291] { [15:31:49.291] { [15:31:49.291] base::local({ [15:31:49.291] has_future <- base::requireNamespace("future", [15:31:49.291] quietly = TRUE) [15:31:49.291] if (has_future) { [15:31:49.291] ns <- base::getNamespace("future") [15:31:49.291] version <- ns[[".package"]][["version"]] [15:31:49.291] if (is.null(version)) [15:31:49.291] version <- utils::packageVersion("future") [15:31:49.291] } [15:31:49.291] else { [15:31:49.291] version <- NULL [15:31:49.291] } [15:31:49.291] if (!has_future || version < "1.8.0") { [15:31:49.291] info <- base::c(r_version = base::gsub("R version ", [15:31:49.291] "", base::R.version$version.string), [15:31:49.291] platform = base::sprintf("%s (%s-bit)", [15:31:49.291] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:49.291] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:49.291] "release", "version")], collapse = " "), [15:31:49.291] hostname = base::Sys.info()[["nodename"]]) [15:31:49.291] info <- base::sprintf("%s: %s", base::names(info), [15:31:49.291] info) [15:31:49.291] info <- base::paste(info, collapse = "; ") [15:31:49.291] if (!has_future) { [15:31:49.291] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:49.291] info) [15:31:49.291] } [15:31:49.291] else { [15:31:49.291] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:49.291] info, version) [15:31:49.291] } [15:31:49.291] base::stop(msg) [15:31:49.291] } [15:31:49.291] }) [15:31:49.291] } [15:31:49.291] ...future.strategy.old <- future::plan("list") [15:31:49.291] options(future.plan = NULL) [15:31:49.291] Sys.unsetenv("R_FUTURE_PLAN") [15:31:49.291] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:49.291] } [15:31:49.291] ...future.workdir <- getwd() [15:31:49.291] } [15:31:49.291] ...future.oldOptions <- base::as.list(base::.Options) [15:31:49.291] ...future.oldEnvVars <- base::Sys.getenv() [15:31:49.291] } [15:31:49.291] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:49.291] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:49.291] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:49.291] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:49.291] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:49.291] future.stdout.windows.reencode = NULL, width = 80L) [15:31:49.291] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:49.291] base::names(...future.oldOptions)) [15:31:49.291] } [15:31:49.291] if (FALSE) { [15:31:49.291] } [15:31:49.291] else { [15:31:49.291] if (TRUE) { [15:31:49.291] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:49.291] open = "w") [15:31:49.291] } [15:31:49.291] else { [15:31:49.291] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:49.291] windows = "NUL", "/dev/null"), open = "w") [15:31:49.291] } [15:31:49.291] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:49.291] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:49.291] base::sink(type = "output", split = FALSE) [15:31:49.291] base::close(...future.stdout) [15:31:49.291] }, add = TRUE) [15:31:49.291] } [15:31:49.291] ...future.frame <- base::sys.nframe() [15:31:49.291] ...future.conditions <- base::list() [15:31:49.291] ...future.rng <- base::globalenv()$.Random.seed [15:31:49.291] if (FALSE) { [15:31:49.291] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:49.291] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:49.291] } [15:31:49.291] ...future.result <- base::tryCatch({ [15:31:49.291] base::withCallingHandlers({ [15:31:49.291] ...future.value <- base::withVisible(base::local({ [15:31:49.291] do.call(function(...) { [15:31:49.291] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.291] if (!identical(...future.globals.maxSize.org, [15:31:49.291] ...future.globals.maxSize)) { [15:31:49.291] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.291] on.exit(options(oopts), add = TRUE) [15:31:49.291] } [15:31:49.291] { [15:31:49.291] lapply(seq_along(...future.elements_ii), [15:31:49.291] FUN = function(jj) { [15:31:49.291] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.291] ...future.FUN(...future.X_jj, ...) [15:31:49.291] }) [15:31:49.291] } [15:31:49.291] }, args = future.call.arguments) [15:31:49.291] })) [15:31:49.291] future::FutureResult(value = ...future.value$value, [15:31:49.291] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:49.291] ...future.rng), globalenv = if (FALSE) [15:31:49.291] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:49.291] ...future.globalenv.names)) [15:31:49.291] else NULL, started = ...future.startTime, version = "1.8") [15:31:49.291] }, condition = base::local({ [15:31:49.291] c <- base::c [15:31:49.291] inherits <- base::inherits [15:31:49.291] invokeRestart <- base::invokeRestart [15:31:49.291] length <- base::length [15:31:49.291] list <- base::list [15:31:49.291] seq.int <- base::seq.int [15:31:49.291] signalCondition <- base::signalCondition [15:31:49.291] sys.calls <- base::sys.calls [15:31:49.291] `[[` <- base::`[[` [15:31:49.291] `+` <- base::`+` [15:31:49.291] `<<-` <- base::`<<-` [15:31:49.291] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:49.291] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:49.291] 3L)] [15:31:49.291] } [15:31:49.291] function(cond) { [15:31:49.291] is_error <- inherits(cond, "error") [15:31:49.291] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:49.291] NULL) [15:31:49.291] if (is_error) { [15:31:49.291] sessionInformation <- function() { [15:31:49.291] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:49.291] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:49.291] search = base::search(), system = base::Sys.info()) [15:31:49.291] } [15:31:49.291] ...future.conditions[[length(...future.conditions) + [15:31:49.291] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:49.291] cond$call), session = sessionInformation(), [15:31:49.291] timestamp = base::Sys.time(), signaled = 0L) [15:31:49.291] signalCondition(cond) [15:31:49.291] } [15:31:49.291] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:49.291] "immediateCondition"))) { [15:31:49.291] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:49.291] ...future.conditions[[length(...future.conditions) + [15:31:49.291] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:49.291] if (TRUE && !signal) { [15:31:49.291] muffleCondition <- function (cond, pattern = "^muffle") [15:31:49.291] { [15:31:49.291] inherits <- base::inherits [15:31:49.291] invokeRestart <- base::invokeRestart [15:31:49.291] is.null <- base::is.null [15:31:49.291] muffled <- FALSE [15:31:49.291] if (inherits(cond, "message")) { [15:31:49.291] muffled <- grepl(pattern, "muffleMessage") [15:31:49.291] if (muffled) [15:31:49.291] invokeRestart("muffleMessage") [15:31:49.291] } [15:31:49.291] else if (inherits(cond, "warning")) { [15:31:49.291] muffled <- grepl(pattern, "muffleWarning") [15:31:49.291] if (muffled) [15:31:49.291] invokeRestart("muffleWarning") [15:31:49.291] } [15:31:49.291] else if (inherits(cond, "condition")) { [15:31:49.291] if (!is.null(pattern)) { [15:31:49.291] computeRestarts <- base::computeRestarts [15:31:49.291] grepl <- base::grepl [15:31:49.291] restarts <- computeRestarts(cond) [15:31:49.291] for (restart in restarts) { [15:31:49.291] name <- restart$name [15:31:49.291] if (is.null(name)) [15:31:49.291] next [15:31:49.291] if (!grepl(pattern, name)) [15:31:49.291] next [15:31:49.291] invokeRestart(restart) [15:31:49.291] muffled <- TRUE [15:31:49.291] break [15:31:49.291] } [15:31:49.291] } [15:31:49.291] } [15:31:49.291] invisible(muffled) [15:31:49.291] } [15:31:49.291] muffleCondition(cond, pattern = "^muffle") [15:31:49.291] } [15:31:49.291] } [15:31:49.291] else { [15:31:49.291] if (TRUE) { [15:31:49.291] muffleCondition <- function (cond, pattern = "^muffle") [15:31:49.291] { [15:31:49.291] inherits <- base::inherits [15:31:49.291] invokeRestart <- base::invokeRestart [15:31:49.291] is.null <- base::is.null [15:31:49.291] muffled <- FALSE [15:31:49.291] if (inherits(cond, "message")) { [15:31:49.291] muffled <- grepl(pattern, "muffleMessage") [15:31:49.291] if (muffled) [15:31:49.291] invokeRestart("muffleMessage") [15:31:49.291] } [15:31:49.291] else if (inherits(cond, "warning")) { [15:31:49.291] muffled <- grepl(pattern, "muffleWarning") [15:31:49.291] if (muffled) [15:31:49.291] invokeRestart("muffleWarning") [15:31:49.291] } [15:31:49.291] else if (inherits(cond, "condition")) { [15:31:49.291] if (!is.null(pattern)) { [15:31:49.291] computeRestarts <- base::computeRestarts [15:31:49.291] grepl <- base::grepl [15:31:49.291] restarts <- computeRestarts(cond) [15:31:49.291] for (restart in restarts) { [15:31:49.291] name <- restart$name [15:31:49.291] if (is.null(name)) [15:31:49.291] next [15:31:49.291] if (!grepl(pattern, name)) [15:31:49.291] next [15:31:49.291] invokeRestart(restart) [15:31:49.291] muffled <- TRUE [15:31:49.291] break [15:31:49.291] } [15:31:49.291] } [15:31:49.291] } [15:31:49.291] invisible(muffled) [15:31:49.291] } [15:31:49.291] muffleCondition(cond, pattern = "^muffle") [15:31:49.291] } [15:31:49.291] } [15:31:49.291] } [15:31:49.291] })) [15:31:49.291] }, error = function(ex) { [15:31:49.291] base::structure(base::list(value = NULL, visible = NULL, [15:31:49.291] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:49.291] ...future.rng), started = ...future.startTime, [15:31:49.291] finished = Sys.time(), session_uuid = NA_character_, [15:31:49.291] version = "1.8"), class = "FutureResult") [15:31:49.291] }, finally = { [15:31:49.291] if (!identical(...future.workdir, getwd())) [15:31:49.291] setwd(...future.workdir) [15:31:49.291] { [15:31:49.291] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:49.291] ...future.oldOptions$nwarnings <- NULL [15:31:49.291] } [15:31:49.291] base::options(...future.oldOptions) [15:31:49.291] if (.Platform$OS.type == "windows") { [15:31:49.291] old_names <- names(...future.oldEnvVars) [15:31:49.291] envs <- base::Sys.getenv() [15:31:49.291] names <- names(envs) [15:31:49.291] common <- intersect(names, old_names) [15:31:49.291] added <- setdiff(names, old_names) [15:31:49.291] removed <- setdiff(old_names, names) [15:31:49.291] changed <- common[...future.oldEnvVars[common] != [15:31:49.291] envs[common]] [15:31:49.291] NAMES <- toupper(changed) [15:31:49.291] args <- list() [15:31:49.291] for (kk in seq_along(NAMES)) { [15:31:49.291] name <- changed[[kk]] [15:31:49.291] NAME <- NAMES[[kk]] [15:31:49.291] if (name != NAME && is.element(NAME, old_names)) [15:31:49.291] next [15:31:49.291] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:49.291] } [15:31:49.291] NAMES <- toupper(added) [15:31:49.291] for (kk in seq_along(NAMES)) { [15:31:49.291] name <- added[[kk]] [15:31:49.291] NAME <- NAMES[[kk]] [15:31:49.291] if (name != NAME && is.element(NAME, old_names)) [15:31:49.291] next [15:31:49.291] args[[name]] <- "" [15:31:49.291] } [15:31:49.291] NAMES <- toupper(removed) [15:31:49.291] for (kk in seq_along(NAMES)) { [15:31:49.291] name <- removed[[kk]] [15:31:49.291] NAME <- NAMES[[kk]] [15:31:49.291] if (name != NAME && is.element(NAME, old_names)) [15:31:49.291] next [15:31:49.291] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:49.291] } [15:31:49.291] if (length(args) > 0) [15:31:49.291] base::do.call(base::Sys.setenv, args = args) [15:31:49.291] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:49.291] } [15:31:49.291] else { [15:31:49.291] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:49.291] } [15:31:49.291] { [15:31:49.291] if (base::length(...future.futureOptionsAdded) > [15:31:49.291] 0L) { [15:31:49.291] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:49.291] base::names(opts) <- ...future.futureOptionsAdded [15:31:49.291] base::options(opts) [15:31:49.291] } [15:31:49.291] { [15:31:49.291] { [15:31:49.291] NULL [15:31:49.291] RNGkind("Mersenne-Twister") [15:31:49.291] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:49.291] inherits = FALSE) [15:31:49.291] } [15:31:49.291] options(future.plan = NULL) [15:31:49.291] if (is.na(NA_character_)) [15:31:49.291] Sys.unsetenv("R_FUTURE_PLAN") [15:31:49.291] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:49.291] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:49.291] .init = FALSE) [15:31:49.291] } [15:31:49.291] } [15:31:49.291] } [15:31:49.291] }) [15:31:49.291] if (TRUE) { [15:31:49.291] base::sink(type = "output", split = FALSE) [15:31:49.291] if (TRUE) { [15:31:49.291] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:49.291] } [15:31:49.291] else { [15:31:49.291] ...future.result["stdout"] <- base::list(NULL) [15:31:49.291] } [15:31:49.291] base::close(...future.stdout) [15:31:49.291] ...future.stdout <- NULL [15:31:49.291] } [15:31:49.291] ...future.result$conditions <- ...future.conditions [15:31:49.291] ...future.result$finished <- base::Sys.time() [15:31:49.291] ...future.result [15:31:49.291] } [15:31:49.295] assign_globals() ... [15:31:49.295] List of 5 [15:31:49.295] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:49.295] $ future.call.arguments :List of 1 [15:31:49.295] ..$ length: int 2 [15:31:49.295] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.295] $ ...future.elements_ii :List of 4 [15:31:49.295] ..$ a: chr "integer" [15:31:49.295] ..$ b: chr "numeric" [15:31:49.295] ..$ c: chr "character" [15:31:49.295] ..$ c: chr "list" [15:31:49.295] $ ...future.seeds_ii : NULL [15:31:49.295] $ ...future.globals.maxSize: NULL [15:31:49.295] - attr(*, "where")=List of 5 [15:31:49.295] ..$ ...future.FUN : [15:31:49.295] ..$ future.call.arguments : [15:31:49.295] ..$ ...future.elements_ii : [15:31:49.295] ..$ ...future.seeds_ii : [15:31:49.295] ..$ ...future.globals.maxSize: [15:31:49.295] - attr(*, "resolved")= logi FALSE [15:31:49.295] - attr(*, "total_size")= num 2240 [15:31:49.295] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.295] - attr(*, "already-done")= logi TRUE [15:31:49.303] - copied '...future.FUN' to environment [15:31:49.304] - copied 'future.call.arguments' to environment [15:31:49.304] - copied '...future.elements_ii' to environment [15:31:49.304] - copied '...future.seeds_ii' to environment [15:31:49.304] - copied '...future.globals.maxSize' to environment [15:31:49.305] assign_globals() ... done [15:31:49.305] plan(): Setting new future strategy stack: [15:31:49.305] List of future strategies: [15:31:49.305] 1. sequential: [15:31:49.305] - args: function (..., envir = parent.frame(), workers = "") [15:31:49.305] - tweaked: FALSE [15:31:49.305] - call: NULL [15:31:49.306] plan(): nbrOfWorkers() = 1 [15:31:49.308] plan(): Setting new future strategy stack: [15:31:49.308] List of future strategies: [15:31:49.308] 1. multisession: [15:31:49.308] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:49.308] - tweaked: FALSE [15:31:49.308] - call: plan(strategy) [15:31:49.311] plan(): nbrOfWorkers() = 1 [15:31:49.311] SequentialFuture started (and completed) [15:31:49.312] - Launch lazy future ... done [15:31:49.312] run() for 'SequentialFuture' ... done [15:31:49.312] Created future: [15:31:49.313] SequentialFuture: [15:31:49.313] Label: 'future_lapply-1' [15:31:49.313] Expression: [15:31:49.313] { [15:31:49.313] do.call(function(...) { [15:31:49.313] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.313] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:49.313] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.313] on.exit(options(oopts), add = TRUE) [15:31:49.313] } [15:31:49.313] { [15:31:49.313] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:49.313] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.313] ...future.FUN(...future.X_jj, ...) [15:31:49.313] }) [15:31:49.313] } [15:31:49.313] }, args = future.call.arguments) [15:31:49.313] } [15:31:49.313] Lazy evaluation: FALSE [15:31:49.313] Asynchronous evaluation: FALSE [15:31:49.313] Local evaluation: TRUE [15:31:49.313] Environment: R_GlobalEnv [15:31:49.313] Capture standard output: TRUE [15:31:49.313] Capture condition classes: 'condition' (excluding 'nothing') [15:31:49.313] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:49.313] Packages: [15:31:49.313] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:49.313] Resolved: TRUE [15:31:49.313] Value: 240 bytes of class 'list' [15:31:49.313] Early signaling: FALSE [15:31:49.313] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:49.313] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:49.315] Chunk #1 of 1 ... DONE [15:31:49.316] Launching 1 futures (chunks) ... DONE [15:31:49.316] Resolving 1 futures (chunks) ... [15:31:49.316] resolve() on list ... [15:31:49.317] recursive: 0 [15:31:49.317] length: 1 [15:31:49.317] [15:31:49.318] resolved() for 'SequentialFuture' ... [15:31:49.318] - state: 'finished' [15:31:49.318] - run: TRUE [15:31:49.319] - result: 'FutureResult' [15:31:49.319] resolved() for 'SequentialFuture' ... done [15:31:49.319] Future #1 [15:31:49.320] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:49.320] - nx: 1 [15:31:49.320] - relay: TRUE [15:31:49.321] - stdout: TRUE [15:31:49.321] - signal: TRUE [15:31:49.321] - resignal: FALSE [15:31:49.322] - force: TRUE [15:31:49.322] - relayed: [n=1] FALSE [15:31:49.322] - queued futures: [n=1] FALSE [15:31:49.322] - until=1 [15:31:49.323] - relaying element #1 [15:31:49.323] - relayed: [n=1] TRUE [15:31:49.324] - queued futures: [n=1] TRUE [15:31:49.324] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:49.324] length: 0 (resolved future 1) [15:31:49.324] Relaying remaining futures [15:31:49.325] signalConditionsASAP(NULL, pos=0) ... [15:31:49.325] - nx: 1 [15:31:49.325] - relay: TRUE [15:31:49.326] - stdout: TRUE [15:31:49.326] - signal: TRUE [15:31:49.326] - resignal: FALSE [15:31:49.326] - force: TRUE [15:31:49.327] - relayed: [n=1] TRUE [15:31:49.327] - queued futures: [n=1] TRUE - flush all [15:31:49.328] - relayed: [n=1] TRUE [15:31:49.328] - queued futures: [n=1] TRUE [15:31:49.328] signalConditionsASAP(NULL, pos=0) ... done [15:31:49.328] resolve() on list ... DONE [15:31:49.329] - Number of value chunks collected: 1 [15:31:49.329] Resolving 1 futures (chunks) ... DONE [15:31:49.329] Reducing values from 1 chunks ... [15:31:49.330] - Number of values collected after concatenation: 4 [15:31:49.330] - Number of values expected: 4 [15:31:49.330] Reducing values from 1 chunks ... DONE [15:31:49.330] 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 [15:31:49.335] future_lapply() ... [15:31:49.340] Number of chunks: 1 [15:31:49.340] getGlobalsAndPackagesXApply() ... [15:31:49.341] - future.globals: TRUE [15:31:49.341] getGlobalsAndPackages() ... [15:31:49.341] Searching for globals... [15:31:49.344] - globals found: [2] 'FUN', '.Internal' [15:31:49.344] Searching for globals ... DONE [15:31:49.344] Resolving globals: FALSE [15:31:49.345] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:49.346] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:49.346] - globals: [1] 'FUN' [15:31:49.346] [15:31:49.347] getGlobalsAndPackages() ... DONE [15:31:49.347] - globals found/used: [n=1] 'FUN' [15:31:49.347] - needed namespaces: [n=0] [15:31:49.348] Finding globals ... DONE [15:31:49.348] - use_args: TRUE [15:31:49.348] - Getting '...' globals ... [15:31:49.349] resolve() on list ... [15:31:49.349] recursive: 0 [15:31:49.350] length: 1 [15:31:49.350] elements: '...' [15:31:49.350] length: 0 (resolved future 1) [15:31:49.351] resolve() on list ... DONE [15:31:49.351] - '...' content: [n=1] 'length' [15:31:49.351] List of 1 [15:31:49.351] $ ...:List of 1 [15:31:49.351] ..$ length: int 2 [15:31:49.351] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.351] - attr(*, "where")=List of 1 [15:31:49.351] ..$ ...: [15:31:49.351] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.351] - attr(*, "resolved")= logi TRUE [15:31:49.351] - attr(*, "total_size")= num NA [15:31:49.357] - Getting '...' globals ... DONE [15:31:49.358] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:49.358] List of 2 [15:31:49.358] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:49.358] $ ... :List of 1 [15:31:49.358] ..$ length: int 2 [15:31:49.358] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.358] - attr(*, "where")=List of 2 [15:31:49.358] ..$ ...future.FUN: [15:31:49.358] ..$ ... : [15:31:49.358] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.358] - attr(*, "resolved")= logi FALSE [15:31:49.358] - attr(*, "total_size")= num 2240 [15:31:49.365] Packages to be attached in all futures: [n=0] [15:31:49.365] getGlobalsAndPackagesXApply() ... DONE [15:31:49.366] Number of futures (= number of chunks): 1 [15:31:49.366] Launching 1 futures (chunks) ... [15:31:49.367] Chunk #1 of 1 ... [15:31:49.367] - Finding globals in 'X' for chunk #1 ... [15:31:49.367] getGlobalsAndPackages() ... [15:31:49.368] Searching for globals... [15:31:49.368] [15:31:49.369] Searching for globals ... DONE [15:31:49.369] - globals: [0] [15:31:49.370] getGlobalsAndPackages() ... DONE [15:31:49.370] + additional globals found: [n=0] [15:31:49.370] + additional namespaces needed: [n=0] [15:31:49.371] - Finding globals in 'X' for chunk #1 ... DONE [15:31:49.371] - seeds: [15:31:49.371] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.372] getGlobalsAndPackages() ... [15:31:49.372] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.378] Resolving globals: FALSE [15:31:49.378] Tweak future expression to call with '...' arguments ... [15:31:49.379] { [15:31:49.379] do.call(function(...) { [15:31:49.379] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.379] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:49.379] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.379] on.exit(options(oopts), add = TRUE) [15:31:49.379] } [15:31:49.379] { [15:31:49.379] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:49.379] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.379] ...future.FUN(...future.X_jj, ...) [15:31:49.379] }) [15:31:49.379] } [15:31:49.379] }, args = future.call.arguments) [15:31:49.379] } [15:31:49.379] Tweak future expression to call with '...' arguments ... DONE [15:31:49.380] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.380] [15:31:49.381] getGlobalsAndPackages() ... DONE [15:31:49.381] run() for 'Future' ... [15:31:49.382] - state: 'created' [15:31:49.382] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:49.386] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:49.386] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:49.386] - Field: 'label' [15:31:49.387] - Field: 'local' [15:31:49.387] - Field: 'owner' [15:31:49.387] - Field: 'envir' [15:31:49.388] - Field: 'packages' [15:31:49.388] - Field: 'gc' [15:31:49.388] - Field: 'conditions' [15:31:49.388] - Field: 'expr' [15:31:49.389] - Field: 'uuid' [15:31:49.389] - Field: 'seed' [15:31:49.389] - Field: 'version' [15:31:49.390] - Field: 'result' [15:31:49.390] - Field: 'asynchronous' [15:31:49.390] - Field: 'calls' [15:31:49.390] - Field: 'globals' [15:31:49.391] - Field: 'stdout' [15:31:49.391] - Field: 'earlySignal' [15:31:49.391] - Field: 'lazy' [15:31:49.392] - Field: 'state' [15:31:49.392] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:49.392] - Launch lazy future ... [15:31:49.393] Packages needed by the future expression (n = 0): [15:31:49.393] Packages needed by future strategies (n = 0): [15:31:49.394] { [15:31:49.394] { [15:31:49.394] { [15:31:49.394] ...future.startTime <- base::Sys.time() [15:31:49.394] { [15:31:49.394] { [15:31:49.394] { [15:31:49.394] base::local({ [15:31:49.394] has_future <- base::requireNamespace("future", [15:31:49.394] quietly = TRUE) [15:31:49.394] if (has_future) { [15:31:49.394] ns <- base::getNamespace("future") [15:31:49.394] version <- ns[[".package"]][["version"]] [15:31:49.394] if (is.null(version)) [15:31:49.394] version <- utils::packageVersion("future") [15:31:49.394] } [15:31:49.394] else { [15:31:49.394] version <- NULL [15:31:49.394] } [15:31:49.394] if (!has_future || version < "1.8.0") { [15:31:49.394] info <- base::c(r_version = base::gsub("R version ", [15:31:49.394] "", base::R.version$version.string), [15:31:49.394] platform = base::sprintf("%s (%s-bit)", [15:31:49.394] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:49.394] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:49.394] "release", "version")], collapse = " "), [15:31:49.394] hostname = base::Sys.info()[["nodename"]]) [15:31:49.394] info <- base::sprintf("%s: %s", base::names(info), [15:31:49.394] info) [15:31:49.394] info <- base::paste(info, collapse = "; ") [15:31:49.394] if (!has_future) { [15:31:49.394] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:49.394] info) [15:31:49.394] } [15:31:49.394] else { [15:31:49.394] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:49.394] info, version) [15:31:49.394] } [15:31:49.394] base::stop(msg) [15:31:49.394] } [15:31:49.394] }) [15:31:49.394] } [15:31:49.394] ...future.strategy.old <- future::plan("list") [15:31:49.394] options(future.plan = NULL) [15:31:49.394] Sys.unsetenv("R_FUTURE_PLAN") [15:31:49.394] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:49.394] } [15:31:49.394] ...future.workdir <- getwd() [15:31:49.394] } [15:31:49.394] ...future.oldOptions <- base::as.list(base::.Options) [15:31:49.394] ...future.oldEnvVars <- base::Sys.getenv() [15:31:49.394] } [15:31:49.394] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:49.394] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:49.394] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:49.394] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:49.394] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:49.394] future.stdout.windows.reencode = NULL, width = 80L) [15:31:49.394] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:49.394] base::names(...future.oldOptions)) [15:31:49.394] } [15:31:49.394] if (FALSE) { [15:31:49.394] } [15:31:49.394] else { [15:31:49.394] if (TRUE) { [15:31:49.394] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:49.394] open = "w") [15:31:49.394] } [15:31:49.394] else { [15:31:49.394] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:49.394] windows = "NUL", "/dev/null"), open = "w") [15:31:49.394] } [15:31:49.394] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:49.394] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:49.394] base::sink(type = "output", split = FALSE) [15:31:49.394] base::close(...future.stdout) [15:31:49.394] }, add = TRUE) [15:31:49.394] } [15:31:49.394] ...future.frame <- base::sys.nframe() [15:31:49.394] ...future.conditions <- base::list() [15:31:49.394] ...future.rng <- base::globalenv()$.Random.seed [15:31:49.394] if (FALSE) { [15:31:49.394] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:49.394] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:49.394] } [15:31:49.394] ...future.result <- base::tryCatch({ [15:31:49.394] base::withCallingHandlers({ [15:31:49.394] ...future.value <- base::withVisible(base::local({ [15:31:49.394] do.call(function(...) { [15:31:49.394] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.394] if (!identical(...future.globals.maxSize.org, [15:31:49.394] ...future.globals.maxSize)) { [15:31:49.394] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.394] on.exit(options(oopts), add = TRUE) [15:31:49.394] } [15:31:49.394] { [15:31:49.394] lapply(seq_along(...future.elements_ii), [15:31:49.394] FUN = function(jj) { [15:31:49.394] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.394] ...future.FUN(...future.X_jj, ...) [15:31:49.394] }) [15:31:49.394] } [15:31:49.394] }, args = future.call.arguments) [15:31:49.394] })) [15:31:49.394] future::FutureResult(value = ...future.value$value, [15:31:49.394] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:49.394] ...future.rng), globalenv = if (FALSE) [15:31:49.394] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:49.394] ...future.globalenv.names)) [15:31:49.394] else NULL, started = ...future.startTime, version = "1.8") [15:31:49.394] }, condition = base::local({ [15:31:49.394] c <- base::c [15:31:49.394] inherits <- base::inherits [15:31:49.394] invokeRestart <- base::invokeRestart [15:31:49.394] length <- base::length [15:31:49.394] list <- base::list [15:31:49.394] seq.int <- base::seq.int [15:31:49.394] signalCondition <- base::signalCondition [15:31:49.394] sys.calls <- base::sys.calls [15:31:49.394] `[[` <- base::`[[` [15:31:49.394] `+` <- base::`+` [15:31:49.394] `<<-` <- base::`<<-` [15:31:49.394] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:49.394] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:49.394] 3L)] [15:31:49.394] } [15:31:49.394] function(cond) { [15:31:49.394] is_error <- inherits(cond, "error") [15:31:49.394] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:49.394] NULL) [15:31:49.394] if (is_error) { [15:31:49.394] sessionInformation <- function() { [15:31:49.394] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:49.394] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:49.394] search = base::search(), system = base::Sys.info()) [15:31:49.394] } [15:31:49.394] ...future.conditions[[length(...future.conditions) + [15:31:49.394] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:49.394] cond$call), session = sessionInformation(), [15:31:49.394] timestamp = base::Sys.time(), signaled = 0L) [15:31:49.394] signalCondition(cond) [15:31:49.394] } [15:31:49.394] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:49.394] "immediateCondition"))) { [15:31:49.394] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:49.394] ...future.conditions[[length(...future.conditions) + [15:31:49.394] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:49.394] if (TRUE && !signal) { [15:31:49.394] muffleCondition <- function (cond, pattern = "^muffle") [15:31:49.394] { [15:31:49.394] inherits <- base::inherits [15:31:49.394] invokeRestart <- base::invokeRestart [15:31:49.394] is.null <- base::is.null [15:31:49.394] muffled <- FALSE [15:31:49.394] if (inherits(cond, "message")) { [15:31:49.394] muffled <- grepl(pattern, "muffleMessage") [15:31:49.394] if (muffled) [15:31:49.394] invokeRestart("muffleMessage") [15:31:49.394] } [15:31:49.394] else if (inherits(cond, "warning")) { [15:31:49.394] muffled <- grepl(pattern, "muffleWarning") [15:31:49.394] if (muffled) [15:31:49.394] invokeRestart("muffleWarning") [15:31:49.394] } [15:31:49.394] else if (inherits(cond, "condition")) { [15:31:49.394] if (!is.null(pattern)) { [15:31:49.394] computeRestarts <- base::computeRestarts [15:31:49.394] grepl <- base::grepl [15:31:49.394] restarts <- computeRestarts(cond) [15:31:49.394] for (restart in restarts) { [15:31:49.394] name <- restart$name [15:31:49.394] if (is.null(name)) [15:31:49.394] next [15:31:49.394] if (!grepl(pattern, name)) [15:31:49.394] next [15:31:49.394] invokeRestart(restart) [15:31:49.394] muffled <- TRUE [15:31:49.394] break [15:31:49.394] } [15:31:49.394] } [15:31:49.394] } [15:31:49.394] invisible(muffled) [15:31:49.394] } [15:31:49.394] muffleCondition(cond, pattern = "^muffle") [15:31:49.394] } [15:31:49.394] } [15:31:49.394] else { [15:31:49.394] if (TRUE) { [15:31:49.394] muffleCondition <- function (cond, pattern = "^muffle") [15:31:49.394] { [15:31:49.394] inherits <- base::inherits [15:31:49.394] invokeRestart <- base::invokeRestart [15:31:49.394] is.null <- base::is.null [15:31:49.394] muffled <- FALSE [15:31:49.394] if (inherits(cond, "message")) { [15:31:49.394] muffled <- grepl(pattern, "muffleMessage") [15:31:49.394] if (muffled) [15:31:49.394] invokeRestart("muffleMessage") [15:31:49.394] } [15:31:49.394] else if (inherits(cond, "warning")) { [15:31:49.394] muffled <- grepl(pattern, "muffleWarning") [15:31:49.394] if (muffled) [15:31:49.394] invokeRestart("muffleWarning") [15:31:49.394] } [15:31:49.394] else if (inherits(cond, "condition")) { [15:31:49.394] if (!is.null(pattern)) { [15:31:49.394] computeRestarts <- base::computeRestarts [15:31:49.394] grepl <- base::grepl [15:31:49.394] restarts <- computeRestarts(cond) [15:31:49.394] for (restart in restarts) { [15:31:49.394] name <- restart$name [15:31:49.394] if (is.null(name)) [15:31:49.394] next [15:31:49.394] if (!grepl(pattern, name)) [15:31:49.394] next [15:31:49.394] invokeRestart(restart) [15:31:49.394] muffled <- TRUE [15:31:49.394] break [15:31:49.394] } [15:31:49.394] } [15:31:49.394] } [15:31:49.394] invisible(muffled) [15:31:49.394] } [15:31:49.394] muffleCondition(cond, pattern = "^muffle") [15:31:49.394] } [15:31:49.394] } [15:31:49.394] } [15:31:49.394] })) [15:31:49.394] }, error = function(ex) { [15:31:49.394] base::structure(base::list(value = NULL, visible = NULL, [15:31:49.394] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:49.394] ...future.rng), started = ...future.startTime, [15:31:49.394] finished = Sys.time(), session_uuid = NA_character_, [15:31:49.394] version = "1.8"), class = "FutureResult") [15:31:49.394] }, finally = { [15:31:49.394] if (!identical(...future.workdir, getwd())) [15:31:49.394] setwd(...future.workdir) [15:31:49.394] { [15:31:49.394] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:49.394] ...future.oldOptions$nwarnings <- NULL [15:31:49.394] } [15:31:49.394] base::options(...future.oldOptions) [15:31:49.394] if (.Platform$OS.type == "windows") { [15:31:49.394] old_names <- names(...future.oldEnvVars) [15:31:49.394] envs <- base::Sys.getenv() [15:31:49.394] names <- names(envs) [15:31:49.394] common <- intersect(names, old_names) [15:31:49.394] added <- setdiff(names, old_names) [15:31:49.394] removed <- setdiff(old_names, names) [15:31:49.394] changed <- common[...future.oldEnvVars[common] != [15:31:49.394] envs[common]] [15:31:49.394] NAMES <- toupper(changed) [15:31:49.394] args <- list() [15:31:49.394] for (kk in seq_along(NAMES)) { [15:31:49.394] name <- changed[[kk]] [15:31:49.394] NAME <- NAMES[[kk]] [15:31:49.394] if (name != NAME && is.element(NAME, old_names)) [15:31:49.394] next [15:31:49.394] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:49.394] } [15:31:49.394] NAMES <- toupper(added) [15:31:49.394] for (kk in seq_along(NAMES)) { [15:31:49.394] name <- added[[kk]] [15:31:49.394] NAME <- NAMES[[kk]] [15:31:49.394] if (name != NAME && is.element(NAME, old_names)) [15:31:49.394] next [15:31:49.394] args[[name]] <- "" [15:31:49.394] } [15:31:49.394] NAMES <- toupper(removed) [15:31:49.394] for (kk in seq_along(NAMES)) { [15:31:49.394] name <- removed[[kk]] [15:31:49.394] NAME <- NAMES[[kk]] [15:31:49.394] if (name != NAME && is.element(NAME, old_names)) [15:31:49.394] next [15:31:49.394] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:49.394] } [15:31:49.394] if (length(args) > 0) [15:31:49.394] base::do.call(base::Sys.setenv, args = args) [15:31:49.394] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:49.394] } [15:31:49.394] else { [15:31:49.394] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:49.394] } [15:31:49.394] { [15:31:49.394] if (base::length(...future.futureOptionsAdded) > [15:31:49.394] 0L) { [15:31:49.394] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:49.394] base::names(opts) <- ...future.futureOptionsAdded [15:31:49.394] base::options(opts) [15:31:49.394] } [15:31:49.394] { [15:31:49.394] { [15:31:49.394] NULL [15:31:49.394] RNGkind("Mersenne-Twister") [15:31:49.394] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:49.394] inherits = FALSE) [15:31:49.394] } [15:31:49.394] options(future.plan = NULL) [15:31:49.394] if (is.na(NA_character_)) [15:31:49.394] Sys.unsetenv("R_FUTURE_PLAN") [15:31:49.394] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:49.394] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:49.394] .init = FALSE) [15:31:49.394] } [15:31:49.394] } [15:31:49.394] } [15:31:49.394] }) [15:31:49.394] if (TRUE) { [15:31:49.394] base::sink(type = "output", split = FALSE) [15:31:49.394] if (TRUE) { [15:31:49.394] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:49.394] } [15:31:49.394] else { [15:31:49.394] ...future.result["stdout"] <- base::list(NULL) [15:31:49.394] } [15:31:49.394] base::close(...future.stdout) [15:31:49.394] ...future.stdout <- NULL [15:31:49.394] } [15:31:49.394] ...future.result$conditions <- ...future.conditions [15:31:49.394] ...future.result$finished <- base::Sys.time() [15:31:49.394] ...future.result [15:31:49.394] } [15:31:49.400] assign_globals() ... [15:31:49.401] List of 5 [15:31:49.401] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:49.401] $ future.call.arguments :List of 1 [15:31:49.401] ..$ length: int 2 [15:31:49.401] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.401] $ ...future.elements_ii :List of 4 [15:31:49.401] ..$ a: chr "integer" [15:31:49.401] ..$ b: chr "numeric" [15:31:49.401] ..$ c: chr "character" [15:31:49.401] ..$ c: chr "list" [15:31:49.401] $ ...future.seeds_ii : NULL [15:31:49.401] $ ...future.globals.maxSize: NULL [15:31:49.401] - attr(*, "where")=List of 5 [15:31:49.401] ..$ ...future.FUN : [15:31:49.401] ..$ future.call.arguments : [15:31:49.401] ..$ ...future.elements_ii : [15:31:49.401] ..$ ...future.seeds_ii : [15:31:49.401] ..$ ...future.globals.maxSize: [15:31:49.401] - attr(*, "resolved")= logi FALSE [15:31:49.401] - attr(*, "total_size")= num 2240 [15:31:49.401] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.401] - attr(*, "already-done")= logi TRUE [15:31:49.410] - copied '...future.FUN' to environment [15:31:49.410] - copied 'future.call.arguments' to environment [15:31:49.411] - copied '...future.elements_ii' to environment [15:31:49.411] - copied '...future.seeds_ii' to environment [15:31:49.411] - copied '...future.globals.maxSize' to environment [15:31:49.411] assign_globals() ... done [15:31:49.412] plan(): Setting new future strategy stack: [15:31:49.412] List of future strategies: [15:31:49.412] 1. sequential: [15:31:49.412] - args: function (..., envir = parent.frame(), workers = "") [15:31:49.412] - tweaked: FALSE [15:31:49.412] - call: NULL [15:31:49.413] plan(): nbrOfWorkers() = 1 [15:31:49.414] plan(): Setting new future strategy stack: [15:31:49.415] List of future strategies: [15:31:49.415] 1. multisession: [15:31:49.415] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:49.415] - tweaked: FALSE [15:31:49.415] - call: plan(strategy) [15:31:49.418] plan(): nbrOfWorkers() = 1 [15:31:49.418] SequentialFuture started (and completed) [15:31:49.418] - Launch lazy future ... done [15:31:49.418] run() for 'SequentialFuture' ... done [15:31:49.418] Created future: [15:31:49.419] SequentialFuture: [15:31:49.419] Label: 'future_lapply-1' [15:31:49.419] Expression: [15:31:49.419] { [15:31:49.419] do.call(function(...) { [15:31:49.419] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.419] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:49.419] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.419] on.exit(options(oopts), add = TRUE) [15:31:49.419] } [15:31:49.419] { [15:31:49.419] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:49.419] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.419] ...future.FUN(...future.X_jj, ...) [15:31:49.419] }) [15:31:49.419] } [15:31:49.419] }, args = future.call.arguments) [15:31:49.419] } [15:31:49.419] Lazy evaluation: FALSE [15:31:49.419] Asynchronous evaluation: FALSE [15:31:49.419] Local evaluation: TRUE [15:31:49.419] Environment: R_GlobalEnv [15:31:49.419] Capture standard output: TRUE [15:31:49.419] Capture condition classes: 'condition' (excluding 'nothing') [15:31:49.419] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:49.419] Packages: [15:31:49.419] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:49.419] Resolved: TRUE [15:31:49.419] Value: 240 bytes of class 'list' [15:31:49.419] Early signaling: FALSE [15:31:49.419] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:49.419] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:49.420] Chunk #1 of 1 ... DONE [15:31:49.421] Launching 1 futures (chunks) ... DONE [15:31:49.421] Resolving 1 futures (chunks) ... [15:31:49.421] resolve() on list ... [15:31:49.421] recursive: 0 [15:31:49.421] length: 1 [15:31:49.422] [15:31:49.422] resolved() for 'SequentialFuture' ... [15:31:49.422] - state: 'finished' [15:31:49.422] - run: TRUE [15:31:49.422] - result: 'FutureResult' [15:31:49.423] resolved() for 'SequentialFuture' ... done [15:31:49.423] Future #1 [15:31:49.423] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:49.423] - nx: 1 [15:31:49.423] - relay: TRUE [15:31:49.424] - stdout: TRUE [15:31:49.424] - signal: TRUE [15:31:49.424] - resignal: FALSE [15:31:49.424] - force: TRUE [15:31:49.424] - relayed: [n=1] FALSE [15:31:49.424] - queued futures: [n=1] FALSE [15:31:49.425] - until=1 [15:31:49.425] - relaying element #1 [15:31:49.425] - relayed: [n=1] TRUE [15:31:49.425] - queued futures: [n=1] TRUE [15:31:49.425] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:49.426] length: 0 (resolved future 1) [15:31:49.426] Relaying remaining futures [15:31:49.426] signalConditionsASAP(NULL, pos=0) ... [15:31:49.426] - nx: 1 [15:31:49.426] - relay: TRUE [15:31:49.426] - stdout: TRUE [15:31:49.427] - signal: TRUE [15:31:49.427] - resignal: FALSE [15:31:49.427] - force: TRUE [15:31:49.427] - relayed: [n=1] TRUE [15:31:49.427] - queued futures: [n=1] TRUE - flush all [15:31:49.427] - relayed: [n=1] TRUE [15:31:49.428] - queued futures: [n=1] TRUE [15:31:49.428] signalConditionsASAP(NULL, pos=0) ... done [15:31:49.428] resolve() on list ... DONE [15:31:49.428] - Number of value chunks collected: 1 [15:31:49.428] Resolving 1 futures (chunks) ... DONE [15:31:49.429] Reducing values from 1 chunks ... [15:31:49.429] - Number of values collected after concatenation: 4 [15:31:49.429] - Number of values expected: 4 [15:31:49.429] Reducing values from 1 chunks ... DONE [15:31:49.429] 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, ...) ... [15:31:49.433] future_lapply() ... [15:31:49.437] Number of chunks: 1 [15:31:49.438] getGlobalsAndPackagesXApply() ... [15:31:49.438] - future.globals: TRUE [15:31:49.438] getGlobalsAndPackages() ... [15:31:49.439] Searching for globals... [15:31:49.440] - globals found: [2] 'FUN', '.Internal' [15:31:49.441] Searching for globals ... DONE [15:31:49.441] Resolving globals: FALSE [15:31:49.441] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:49.442] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:49.442] - globals: [1] 'FUN' [15:31:49.442] [15:31:49.442] getGlobalsAndPackages() ... DONE [15:31:49.443] - globals found/used: [n=1] 'FUN' [15:31:49.443] - needed namespaces: [n=0] [15:31:49.443] Finding globals ... DONE [15:31:49.443] - use_args: TRUE [15:31:49.443] - Getting '...' globals ... [15:31:49.444] resolve() on list ... [15:31:49.444] recursive: 0 [15:31:49.444] length: 1 [15:31:49.444] elements: '...' [15:31:49.445] length: 0 (resolved future 1) [15:31:49.445] resolve() on list ... DONE [15:31:49.445] - '...' content: [n=1] 'length' [15:31:49.445] List of 1 [15:31:49.445] $ ...:List of 1 [15:31:49.445] ..$ length: int 2 [15:31:49.445] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.445] - attr(*, "where")=List of 1 [15:31:49.445] ..$ ...: [15:31:49.445] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.445] - attr(*, "resolved")= logi TRUE [15:31:49.445] - attr(*, "total_size")= num NA [15:31:49.450] - Getting '...' globals ... DONE [15:31:49.450] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:49.450] List of 2 [15:31:49.450] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:49.450] $ ... :List of 1 [15:31:49.450] ..$ length: int 2 [15:31:49.450] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.450] - attr(*, "where")=List of 2 [15:31:49.450] ..$ ...future.FUN: [15:31:49.450] ..$ ... : [15:31:49.450] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.450] - attr(*, "resolved")= logi FALSE [15:31:49.450] - attr(*, "total_size")= num 2240 [15:31:49.455] Packages to be attached in all futures: [n=0] [15:31:49.455] getGlobalsAndPackagesXApply() ... DONE [15:31:49.456] Number of futures (= number of chunks): 1 [15:31:49.456] Launching 1 futures (chunks) ... [15:31:49.456] Chunk #1 of 1 ... [15:31:49.457] - Finding globals in 'X' for chunk #1 ... [15:31:49.457] getGlobalsAndPackages() ... [15:31:49.457] Searching for globals... [15:31:49.458] [15:31:49.458] Searching for globals ... DONE [15:31:49.458] - globals: [0] [15:31:49.458] getGlobalsAndPackages() ... DONE [15:31:49.459] + additional globals found: [n=0] [15:31:49.459] + additional namespaces needed: [n=0] [15:31:49.459] - Finding globals in 'X' for chunk #1 ... DONE [15:31:49.459] - seeds: [15:31:49.460] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.460] getGlobalsAndPackages() ... [15:31:49.460] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.460] Resolving globals: FALSE [15:31:49.461] Tweak future expression to call with '...' arguments ... [15:31:49.461] { [15:31:49.461] do.call(function(...) { [15:31:49.461] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.461] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:49.461] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.461] on.exit(options(oopts), add = TRUE) [15:31:49.461] } [15:31:49.461] { [15:31:49.461] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:49.461] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.461] ...future.FUN(...future.X_jj, ...) [15:31:49.461] }) [15:31:49.461] } [15:31:49.461] }, args = future.call.arguments) [15:31:49.461] } [15:31:49.462] Tweak future expression to call with '...' arguments ... DONE [15:31:49.462] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.463] [15:31:49.463] getGlobalsAndPackages() ... DONE [15:31:49.464] run() for 'Future' ... [15:31:49.464] - state: 'created' [15:31:49.464] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:49.468] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:49.468] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:49.469] - Field: 'label' [15:31:49.469] - Field: 'local' [15:31:49.469] - Field: 'owner' [15:31:49.470] - Field: 'envir' [15:31:49.470] - Field: 'packages' [15:31:49.470] - Field: 'gc' [15:31:49.470] - Field: 'conditions' [15:31:49.471] - Field: 'expr' [15:31:49.471] - Field: 'uuid' [15:31:49.471] - Field: 'seed' [15:31:49.471] - Field: 'version' [15:31:49.472] - Field: 'result' [15:31:49.472] - Field: 'asynchronous' [15:31:49.472] - Field: 'calls' [15:31:49.472] - Field: 'globals' [15:31:49.473] - Field: 'stdout' [15:31:49.473] - Field: 'earlySignal' [15:31:49.473] - Field: 'lazy' [15:31:49.474] - Field: 'state' [15:31:49.474] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:49.474] - Launch lazy future ... [15:31:49.475] Packages needed by the future expression (n = 0): [15:31:49.475] Packages needed by future strategies (n = 0): [15:31:49.476] { [15:31:49.476] { [15:31:49.476] { [15:31:49.476] ...future.startTime <- base::Sys.time() [15:31:49.476] { [15:31:49.476] { [15:31:49.476] { [15:31:49.476] base::local({ [15:31:49.476] has_future <- base::requireNamespace("future", [15:31:49.476] quietly = TRUE) [15:31:49.476] if (has_future) { [15:31:49.476] ns <- base::getNamespace("future") [15:31:49.476] version <- ns[[".package"]][["version"]] [15:31:49.476] if (is.null(version)) [15:31:49.476] version <- utils::packageVersion("future") [15:31:49.476] } [15:31:49.476] else { [15:31:49.476] version <- NULL [15:31:49.476] } [15:31:49.476] if (!has_future || version < "1.8.0") { [15:31:49.476] info <- base::c(r_version = base::gsub("R version ", [15:31:49.476] "", base::R.version$version.string), [15:31:49.476] platform = base::sprintf("%s (%s-bit)", [15:31:49.476] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:49.476] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:49.476] "release", "version")], collapse = " "), [15:31:49.476] hostname = base::Sys.info()[["nodename"]]) [15:31:49.476] info <- base::sprintf("%s: %s", base::names(info), [15:31:49.476] info) [15:31:49.476] info <- base::paste(info, collapse = "; ") [15:31:49.476] if (!has_future) { [15:31:49.476] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:49.476] info) [15:31:49.476] } [15:31:49.476] else { [15:31:49.476] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:49.476] info, version) [15:31:49.476] } [15:31:49.476] base::stop(msg) [15:31:49.476] } [15:31:49.476] }) [15:31:49.476] } [15:31:49.476] ...future.strategy.old <- future::plan("list") [15:31:49.476] options(future.plan = NULL) [15:31:49.476] Sys.unsetenv("R_FUTURE_PLAN") [15:31:49.476] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:49.476] } [15:31:49.476] ...future.workdir <- getwd() [15:31:49.476] } [15:31:49.476] ...future.oldOptions <- base::as.list(base::.Options) [15:31:49.476] ...future.oldEnvVars <- base::Sys.getenv() [15:31:49.476] } [15:31:49.476] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:49.476] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:49.476] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:49.476] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:49.476] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:49.476] future.stdout.windows.reencode = NULL, width = 80L) [15:31:49.476] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:49.476] base::names(...future.oldOptions)) [15:31:49.476] } [15:31:49.476] if (FALSE) { [15:31:49.476] } [15:31:49.476] else { [15:31:49.476] if (TRUE) { [15:31:49.476] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:49.476] open = "w") [15:31:49.476] } [15:31:49.476] else { [15:31:49.476] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:49.476] windows = "NUL", "/dev/null"), open = "w") [15:31:49.476] } [15:31:49.476] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:49.476] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:49.476] base::sink(type = "output", split = FALSE) [15:31:49.476] base::close(...future.stdout) [15:31:49.476] }, add = TRUE) [15:31:49.476] } [15:31:49.476] ...future.frame <- base::sys.nframe() [15:31:49.476] ...future.conditions <- base::list() [15:31:49.476] ...future.rng <- base::globalenv()$.Random.seed [15:31:49.476] if (FALSE) { [15:31:49.476] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:49.476] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:49.476] } [15:31:49.476] ...future.result <- base::tryCatch({ [15:31:49.476] base::withCallingHandlers({ [15:31:49.476] ...future.value <- base::withVisible(base::local({ [15:31:49.476] do.call(function(...) { [15:31:49.476] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.476] if (!identical(...future.globals.maxSize.org, [15:31:49.476] ...future.globals.maxSize)) { [15:31:49.476] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.476] on.exit(options(oopts), add = TRUE) [15:31:49.476] } [15:31:49.476] { [15:31:49.476] lapply(seq_along(...future.elements_ii), [15:31:49.476] FUN = function(jj) { [15:31:49.476] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.476] ...future.FUN(...future.X_jj, ...) [15:31:49.476] }) [15:31:49.476] } [15:31:49.476] }, args = future.call.arguments) [15:31:49.476] })) [15:31:49.476] future::FutureResult(value = ...future.value$value, [15:31:49.476] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:49.476] ...future.rng), globalenv = if (FALSE) [15:31:49.476] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:49.476] ...future.globalenv.names)) [15:31:49.476] else NULL, started = ...future.startTime, version = "1.8") [15:31:49.476] }, condition = base::local({ [15:31:49.476] c <- base::c [15:31:49.476] inherits <- base::inherits [15:31:49.476] invokeRestart <- base::invokeRestart [15:31:49.476] length <- base::length [15:31:49.476] list <- base::list [15:31:49.476] seq.int <- base::seq.int [15:31:49.476] signalCondition <- base::signalCondition [15:31:49.476] sys.calls <- base::sys.calls [15:31:49.476] `[[` <- base::`[[` [15:31:49.476] `+` <- base::`+` [15:31:49.476] `<<-` <- base::`<<-` [15:31:49.476] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:49.476] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:49.476] 3L)] [15:31:49.476] } [15:31:49.476] function(cond) { [15:31:49.476] is_error <- inherits(cond, "error") [15:31:49.476] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:49.476] NULL) [15:31:49.476] if (is_error) { [15:31:49.476] sessionInformation <- function() { [15:31:49.476] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:49.476] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:49.476] search = base::search(), system = base::Sys.info()) [15:31:49.476] } [15:31:49.476] ...future.conditions[[length(...future.conditions) + [15:31:49.476] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:49.476] cond$call), session = sessionInformation(), [15:31:49.476] timestamp = base::Sys.time(), signaled = 0L) [15:31:49.476] signalCondition(cond) [15:31:49.476] } [15:31:49.476] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:49.476] "immediateCondition"))) { [15:31:49.476] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:49.476] ...future.conditions[[length(...future.conditions) + [15:31:49.476] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:49.476] if (TRUE && !signal) { [15:31:49.476] muffleCondition <- function (cond, pattern = "^muffle") [15:31:49.476] { [15:31:49.476] inherits <- base::inherits [15:31:49.476] invokeRestart <- base::invokeRestart [15:31:49.476] is.null <- base::is.null [15:31:49.476] muffled <- FALSE [15:31:49.476] if (inherits(cond, "message")) { [15:31:49.476] muffled <- grepl(pattern, "muffleMessage") [15:31:49.476] if (muffled) [15:31:49.476] invokeRestart("muffleMessage") [15:31:49.476] } [15:31:49.476] else if (inherits(cond, "warning")) { [15:31:49.476] muffled <- grepl(pattern, "muffleWarning") [15:31:49.476] if (muffled) [15:31:49.476] invokeRestart("muffleWarning") [15:31:49.476] } [15:31:49.476] else if (inherits(cond, "condition")) { [15:31:49.476] if (!is.null(pattern)) { [15:31:49.476] computeRestarts <- base::computeRestarts [15:31:49.476] grepl <- base::grepl [15:31:49.476] restarts <- computeRestarts(cond) [15:31:49.476] for (restart in restarts) { [15:31:49.476] name <- restart$name [15:31:49.476] if (is.null(name)) [15:31:49.476] next [15:31:49.476] if (!grepl(pattern, name)) [15:31:49.476] next [15:31:49.476] invokeRestart(restart) [15:31:49.476] muffled <- TRUE [15:31:49.476] break [15:31:49.476] } [15:31:49.476] } [15:31:49.476] } [15:31:49.476] invisible(muffled) [15:31:49.476] } [15:31:49.476] muffleCondition(cond, pattern = "^muffle") [15:31:49.476] } [15:31:49.476] } [15:31:49.476] else { [15:31:49.476] if (TRUE) { [15:31:49.476] muffleCondition <- function (cond, pattern = "^muffle") [15:31:49.476] { [15:31:49.476] inherits <- base::inherits [15:31:49.476] invokeRestart <- base::invokeRestart [15:31:49.476] is.null <- base::is.null [15:31:49.476] muffled <- FALSE [15:31:49.476] if (inherits(cond, "message")) { [15:31:49.476] muffled <- grepl(pattern, "muffleMessage") [15:31:49.476] if (muffled) [15:31:49.476] invokeRestart("muffleMessage") [15:31:49.476] } [15:31:49.476] else if (inherits(cond, "warning")) { [15:31:49.476] muffled <- grepl(pattern, "muffleWarning") [15:31:49.476] if (muffled) [15:31:49.476] invokeRestart("muffleWarning") [15:31:49.476] } [15:31:49.476] else if (inherits(cond, "condition")) { [15:31:49.476] if (!is.null(pattern)) { [15:31:49.476] computeRestarts <- base::computeRestarts [15:31:49.476] grepl <- base::grepl [15:31:49.476] restarts <- computeRestarts(cond) [15:31:49.476] for (restart in restarts) { [15:31:49.476] name <- restart$name [15:31:49.476] if (is.null(name)) [15:31:49.476] next [15:31:49.476] if (!grepl(pattern, name)) [15:31:49.476] next [15:31:49.476] invokeRestart(restart) [15:31:49.476] muffled <- TRUE [15:31:49.476] break [15:31:49.476] } [15:31:49.476] } [15:31:49.476] } [15:31:49.476] invisible(muffled) [15:31:49.476] } [15:31:49.476] muffleCondition(cond, pattern = "^muffle") [15:31:49.476] } [15:31:49.476] } [15:31:49.476] } [15:31:49.476] })) [15:31:49.476] }, error = function(ex) { [15:31:49.476] base::structure(base::list(value = NULL, visible = NULL, [15:31:49.476] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:49.476] ...future.rng), started = ...future.startTime, [15:31:49.476] finished = Sys.time(), session_uuid = NA_character_, [15:31:49.476] version = "1.8"), class = "FutureResult") [15:31:49.476] }, finally = { [15:31:49.476] if (!identical(...future.workdir, getwd())) [15:31:49.476] setwd(...future.workdir) [15:31:49.476] { [15:31:49.476] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:49.476] ...future.oldOptions$nwarnings <- NULL [15:31:49.476] } [15:31:49.476] base::options(...future.oldOptions) [15:31:49.476] if (.Platform$OS.type == "windows") { [15:31:49.476] old_names <- names(...future.oldEnvVars) [15:31:49.476] envs <- base::Sys.getenv() [15:31:49.476] names <- names(envs) [15:31:49.476] common <- intersect(names, old_names) [15:31:49.476] added <- setdiff(names, old_names) [15:31:49.476] removed <- setdiff(old_names, names) [15:31:49.476] changed <- common[...future.oldEnvVars[common] != [15:31:49.476] envs[common]] [15:31:49.476] NAMES <- toupper(changed) [15:31:49.476] args <- list() [15:31:49.476] for (kk in seq_along(NAMES)) { [15:31:49.476] name <- changed[[kk]] [15:31:49.476] NAME <- NAMES[[kk]] [15:31:49.476] if (name != NAME && is.element(NAME, old_names)) [15:31:49.476] next [15:31:49.476] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:49.476] } [15:31:49.476] NAMES <- toupper(added) [15:31:49.476] for (kk in seq_along(NAMES)) { [15:31:49.476] name <- added[[kk]] [15:31:49.476] NAME <- NAMES[[kk]] [15:31:49.476] if (name != NAME && is.element(NAME, old_names)) [15:31:49.476] next [15:31:49.476] args[[name]] <- "" [15:31:49.476] } [15:31:49.476] NAMES <- toupper(removed) [15:31:49.476] for (kk in seq_along(NAMES)) { [15:31:49.476] name <- removed[[kk]] [15:31:49.476] NAME <- NAMES[[kk]] [15:31:49.476] if (name != NAME && is.element(NAME, old_names)) [15:31:49.476] next [15:31:49.476] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:49.476] } [15:31:49.476] if (length(args) > 0) [15:31:49.476] base::do.call(base::Sys.setenv, args = args) [15:31:49.476] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:49.476] } [15:31:49.476] else { [15:31:49.476] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:49.476] } [15:31:49.476] { [15:31:49.476] if (base::length(...future.futureOptionsAdded) > [15:31:49.476] 0L) { [15:31:49.476] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:49.476] base::names(opts) <- ...future.futureOptionsAdded [15:31:49.476] base::options(opts) [15:31:49.476] } [15:31:49.476] { [15:31:49.476] { [15:31:49.476] NULL [15:31:49.476] RNGkind("Mersenne-Twister") [15:31:49.476] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:49.476] inherits = FALSE) [15:31:49.476] } [15:31:49.476] options(future.plan = NULL) [15:31:49.476] if (is.na(NA_character_)) [15:31:49.476] Sys.unsetenv("R_FUTURE_PLAN") [15:31:49.476] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:49.476] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:49.476] .init = FALSE) [15:31:49.476] } [15:31:49.476] } [15:31:49.476] } [15:31:49.476] }) [15:31:49.476] if (TRUE) { [15:31:49.476] base::sink(type = "output", split = FALSE) [15:31:49.476] if (TRUE) { [15:31:49.476] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:49.476] } [15:31:49.476] else { [15:31:49.476] ...future.result["stdout"] <- base::list(NULL) [15:31:49.476] } [15:31:49.476] base::close(...future.stdout) [15:31:49.476] ...future.stdout <- NULL [15:31:49.476] } [15:31:49.476] ...future.result$conditions <- ...future.conditions [15:31:49.476] ...future.result$finished <- base::Sys.time() [15:31:49.476] ...future.result [15:31:49.476] } [15:31:49.482] assign_globals() ... [15:31:49.482] List of 5 [15:31:49.482] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:49.482] $ future.call.arguments :List of 1 [15:31:49.482] ..$ length: int 2 [15:31:49.482] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.482] $ ...future.elements_ii :List of 4 [15:31:49.482] ..$ a: chr "integer" [15:31:49.482] ..$ b: chr "numeric" [15:31:49.482] ..$ c: chr "character" [15:31:49.482] ..$ c: chr "list" [15:31:49.482] $ ...future.seeds_ii : NULL [15:31:49.482] $ ...future.globals.maxSize: NULL [15:31:49.482] - attr(*, "where")=List of 5 [15:31:49.482] ..$ ...future.FUN : [15:31:49.482] ..$ future.call.arguments : [15:31:49.482] ..$ ...future.elements_ii : [15:31:49.482] ..$ ...future.seeds_ii : [15:31:49.482] ..$ ...future.globals.maxSize: [15:31:49.482] - attr(*, "resolved")= logi FALSE [15:31:49.482] - attr(*, "total_size")= num 2240 [15:31:49.482] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.482] - attr(*, "already-done")= logi TRUE [15:31:49.493] - copied '...future.FUN' to environment [15:31:49.494] - copied 'future.call.arguments' to environment [15:31:49.494] - copied '...future.elements_ii' to environment [15:31:49.494] - copied '...future.seeds_ii' to environment [15:31:49.494] - copied '...future.globals.maxSize' to environment [15:31:49.495] assign_globals() ... done [15:31:49.495] plan(): Setting new future strategy stack: [15:31:49.496] List of future strategies: [15:31:49.496] 1. sequential: [15:31:49.496] - args: function (..., envir = parent.frame(), workers = "") [15:31:49.496] - tweaked: FALSE [15:31:49.496] - call: NULL [15:31:49.497] plan(): nbrOfWorkers() = 1 [15:31:49.499] plan(): Setting new future strategy stack: [15:31:49.499] List of future strategies: [15:31:49.499] 1. multisession: [15:31:49.499] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:49.499] - tweaked: FALSE [15:31:49.499] - call: plan(strategy) [15:31:49.503] plan(): nbrOfWorkers() = 1 [15:31:49.503] SequentialFuture started (and completed) [15:31:49.503] - Launch lazy future ... done [15:31:49.504] run() for 'SequentialFuture' ... done [15:31:49.504] Created future: [15:31:49.504] SequentialFuture: [15:31:49.504] Label: 'future_lapply-1' [15:31:49.504] Expression: [15:31:49.504] { [15:31:49.504] do.call(function(...) { [15:31:49.504] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.504] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:49.504] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.504] on.exit(options(oopts), add = TRUE) [15:31:49.504] } [15:31:49.504] { [15:31:49.504] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:49.504] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.504] ...future.FUN(...future.X_jj, ...) [15:31:49.504] }) [15:31:49.504] } [15:31:49.504] }, args = future.call.arguments) [15:31:49.504] } [15:31:49.504] Lazy evaluation: FALSE [15:31:49.504] Asynchronous evaluation: FALSE [15:31:49.504] Local evaluation: TRUE [15:31:49.504] Environment: R_GlobalEnv [15:31:49.504] Capture standard output: TRUE [15:31:49.504] Capture condition classes: 'condition' (excluding 'nothing') [15:31:49.504] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:49.504] Packages: [15:31:49.504] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:49.504] Resolved: TRUE [15:31:49.504] Value: 240 bytes of class 'list' [15:31:49.504] Early signaling: FALSE [15:31:49.504] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:49.504] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:49.507] Chunk #1 of 1 ... DONE [15:31:49.507] Launching 1 futures (chunks) ... DONE [15:31:49.507] Resolving 1 futures (chunks) ... [15:31:49.508] resolve() on list ... [15:31:49.508] recursive: 0 [15:31:49.508] length: 1 [15:31:49.508] [15:31:49.509] resolved() for 'SequentialFuture' ... [15:31:49.509] - state: 'finished' [15:31:49.509] - run: TRUE [15:31:49.509] - result: 'FutureResult' [15:31:49.510] resolved() for 'SequentialFuture' ... done [15:31:49.510] Future #1 [15:31:49.510] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:49.511] - nx: 1 [15:31:49.511] - relay: TRUE [15:31:49.511] - stdout: TRUE [15:31:49.511] - signal: TRUE [15:31:49.511] - resignal: FALSE [15:31:49.512] - force: TRUE [15:31:49.512] - relayed: [n=1] FALSE [15:31:49.512] - queued futures: [n=1] FALSE [15:31:49.512] - until=1 [15:31:49.513] - relaying element #1 [15:31:49.513] - relayed: [n=1] TRUE [15:31:49.513] - queued futures: [n=1] TRUE [15:31:49.514] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:49.514] length: 0 (resolved future 1) [15:31:49.514] Relaying remaining futures [15:31:49.514] signalConditionsASAP(NULL, pos=0) ... [15:31:49.515] - nx: 1 [15:31:49.515] - relay: TRUE [15:31:49.515] - stdout: TRUE [15:31:49.515] - signal: TRUE [15:31:49.515] - resignal: FALSE [15:31:49.516] - force: TRUE [15:31:49.516] - relayed: [n=1] TRUE [15:31:49.516] - queued futures: [n=1] TRUE - flush all [15:31:49.517] - relayed: [n=1] TRUE [15:31:49.517] - queued futures: [n=1] TRUE [15:31:49.517] signalConditionsASAP(NULL, pos=0) ... done [15:31:49.517] resolve() on list ... DONE [15:31:49.518] - Number of value chunks collected: 1 [15:31:49.518] Resolving 1 futures (chunks) ... DONE [15:31:49.518] Reducing values from 1 chunks ... [15:31:49.518] - Number of values collected after concatenation: 4 [15:31:49.519] - Number of values expected: 4 [15:31:49.519] Reducing values from 1 chunks ... DONE [15:31:49.519] 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, ...) ... [15:31:49.523] future_lapply() ... [15:31:49.541] Number of chunks: 1 [15:31:49.542] getGlobalsAndPackagesXApply() ... [15:31:49.542] - future.globals: TRUE [15:31:49.548] getGlobalsAndPackages() ... [15:31:49.548] Searching for globals... [15:31:49.563] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [15:31:49.564] Searching for globals ... DONE [15:31:49.564] Resolving globals: FALSE [15:31:49.566] The total size of the 1 globals is 69.62 KiB (71288 bytes) [15:31:49.567] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 69.62 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (69.62 KiB of class 'function') [15:31:49.567] - globals: [1] 'FUN' [15:31:49.567] - packages: [1] 'future' [15:31:49.568] getGlobalsAndPackages() ... DONE [15:31:49.568] - globals found/used: [n=1] 'FUN' [15:31:49.568] - needed namespaces: [n=1] 'future' [15:31:49.569] Finding globals ... DONE [15:31:49.569] - use_args: TRUE [15:31:49.569] - Getting '...' globals ... [15:31:49.570] resolve() on list ... [15:31:49.570] recursive: 0 [15:31:49.570] length: 1 [15:31:49.571] elements: '...' [15:31:49.571] length: 0 (resolved future 1) [15:31:49.571] resolve() on list ... DONE [15:31:49.572] - '...' content: [n=2] 'collapse', 'maxHead' [15:31:49.572] List of 1 [15:31:49.572] $ ...:List of 2 [15:31:49.572] ..$ collapse: chr "; " [15:31:49.572] ..$ maxHead : int 3 [15:31:49.572] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.572] - attr(*, "where")=List of 1 [15:31:49.572] ..$ ...: [15:31:49.572] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.572] - attr(*, "resolved")= logi TRUE [15:31:49.572] - attr(*, "total_size")= num NA [15:31:49.579] - Getting '...' globals ... DONE [15:31:49.579] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:49.580] List of 2 [15:31:49.580] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:49.580] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:49.580] $ ... :List of 2 [15:31:49.580] ..$ collapse: chr "; " [15:31:49.580] ..$ maxHead : int 3 [15:31:49.580] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.580] - attr(*, "where")=List of 2 [15:31:49.580] ..$ ...future.FUN: [15:31:49.580] ..$ ... : [15:31:49.580] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.580] - attr(*, "resolved")= logi FALSE [15:31:49.580] - attr(*, "total_size")= num 71456 [15:31:49.587] Packages to be attached in all futures: [n=1] 'future' [15:31:49.587] getGlobalsAndPackagesXApply() ... DONE [15:31:49.588] Number of futures (= number of chunks): 1 [15:31:49.588] Launching 1 futures (chunks) ... [15:31:49.589] Chunk #1 of 1 ... [15:31:49.589] - Finding globals in 'X' for chunk #1 ... [15:31:49.589] getGlobalsAndPackages() ... [15:31:49.590] Searching for globals... [15:31:49.590] [15:31:49.591] Searching for globals ... DONE [15:31:49.591] - globals: [0] [15:31:49.591] getGlobalsAndPackages() ... DONE [15:31:49.591] + additional globals found: [n=0] [15:31:49.592] + additional namespaces needed: [n=0] [15:31:49.592] - Finding globals in 'X' for chunk #1 ... DONE [15:31:49.592] - seeds: [15:31:49.592] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.593] getGlobalsAndPackages() ... [15:31:49.593] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.593] Resolving globals: FALSE [15:31:49.594] Tweak future expression to call with '...' arguments ... [15:31:49.594] { [15:31:49.594] do.call(function(...) { [15:31:49.594] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.594] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:49.594] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.594] on.exit(options(oopts), add = TRUE) [15:31:49.594] } [15:31:49.594] { [15:31:49.594] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:49.594] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.594] ...future.FUN(...future.X_jj, ...) [15:31:49.594] }) [15:31:49.594] } [15:31:49.594] }, args = future.call.arguments) [15:31:49.594] } [15:31:49.595] Tweak future expression to call with '...' arguments ... DONE [15:31:49.596] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.596] - packages: [1] 'future' [15:31:49.597] getGlobalsAndPackages() ... DONE [15:31:49.597] run() for 'Future' ... [15:31:49.598] - state: 'created' [15:31:49.598] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:49.603] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:49.603] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:49.603] - Field: 'label' [15:31:49.604] - Field: 'local' [15:31:49.604] - Field: 'owner' [15:31:49.604] - Field: 'envir' [15:31:49.605] - Field: 'packages' [15:31:49.605] - Field: 'gc' [15:31:49.605] - Field: 'conditions' [15:31:49.605] - Field: 'expr' [15:31:49.606] - Field: 'uuid' [15:31:49.606] - Field: 'seed' [15:31:49.606] - Field: 'version' [15:31:49.607] - Field: 'result' [15:31:49.607] - Field: 'asynchronous' [15:31:49.607] - Field: 'calls' [15:31:49.608] - Field: 'globals' [15:31:49.608] - Field: 'stdout' [15:31:49.608] - Field: 'earlySignal' [15:31:49.608] - Field: 'lazy' [15:31:49.609] - Field: 'state' [15:31:49.609] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:49.609] - Launch lazy future ... [15:31:49.610] Packages needed by the future expression (n = 1): 'future' [15:31:49.610] Packages needed by future strategies (n = 0): [15:31:49.612] { [15:31:49.612] { [15:31:49.612] { [15:31:49.612] ...future.startTime <- base::Sys.time() [15:31:49.612] { [15:31:49.612] { [15:31:49.612] { [15:31:49.612] { [15:31:49.612] base::local({ [15:31:49.612] has_future <- base::requireNamespace("future", [15:31:49.612] quietly = TRUE) [15:31:49.612] if (has_future) { [15:31:49.612] ns <- base::getNamespace("future") [15:31:49.612] version <- ns[[".package"]][["version"]] [15:31:49.612] if (is.null(version)) [15:31:49.612] version <- utils::packageVersion("future") [15:31:49.612] } [15:31:49.612] else { [15:31:49.612] version <- NULL [15:31:49.612] } [15:31:49.612] if (!has_future || version < "1.8.0") { [15:31:49.612] info <- base::c(r_version = base::gsub("R version ", [15:31:49.612] "", base::R.version$version.string), [15:31:49.612] platform = base::sprintf("%s (%s-bit)", [15:31:49.612] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:49.612] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:49.612] "release", "version")], collapse = " "), [15:31:49.612] hostname = base::Sys.info()[["nodename"]]) [15:31:49.612] info <- base::sprintf("%s: %s", base::names(info), [15:31:49.612] info) [15:31:49.612] info <- base::paste(info, collapse = "; ") [15:31:49.612] if (!has_future) { [15:31:49.612] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:49.612] info) [15:31:49.612] } [15:31:49.612] else { [15:31:49.612] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:49.612] info, version) [15:31:49.612] } [15:31:49.612] base::stop(msg) [15:31:49.612] } [15:31:49.612] }) [15:31:49.612] } [15:31:49.612] base::local({ [15:31:49.612] for (pkg in "future") { [15:31:49.612] base::loadNamespace(pkg) [15:31:49.612] base::library(pkg, character.only = TRUE) [15:31:49.612] } [15:31:49.612] }) [15:31:49.612] } [15:31:49.612] ...future.strategy.old <- future::plan("list") [15:31:49.612] options(future.plan = NULL) [15:31:49.612] Sys.unsetenv("R_FUTURE_PLAN") [15:31:49.612] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:49.612] } [15:31:49.612] ...future.workdir <- getwd() [15:31:49.612] } [15:31:49.612] ...future.oldOptions <- base::as.list(base::.Options) [15:31:49.612] ...future.oldEnvVars <- base::Sys.getenv() [15:31:49.612] } [15:31:49.612] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:49.612] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:49.612] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:49.612] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:49.612] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:49.612] future.stdout.windows.reencode = NULL, width = 80L) [15:31:49.612] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:49.612] base::names(...future.oldOptions)) [15:31:49.612] } [15:31:49.612] if (FALSE) { [15:31:49.612] } [15:31:49.612] else { [15:31:49.612] if (TRUE) { [15:31:49.612] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:49.612] open = "w") [15:31:49.612] } [15:31:49.612] else { [15:31:49.612] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:49.612] windows = "NUL", "/dev/null"), open = "w") [15:31:49.612] } [15:31:49.612] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:49.612] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:49.612] base::sink(type = "output", split = FALSE) [15:31:49.612] base::close(...future.stdout) [15:31:49.612] }, add = TRUE) [15:31:49.612] } [15:31:49.612] ...future.frame <- base::sys.nframe() [15:31:49.612] ...future.conditions <- base::list() [15:31:49.612] ...future.rng <- base::globalenv()$.Random.seed [15:31:49.612] if (FALSE) { [15:31:49.612] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:49.612] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:49.612] } [15:31:49.612] ...future.result <- base::tryCatch({ [15:31:49.612] base::withCallingHandlers({ [15:31:49.612] ...future.value <- base::withVisible(base::local({ [15:31:49.612] do.call(function(...) { [15:31:49.612] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.612] if (!identical(...future.globals.maxSize.org, [15:31:49.612] ...future.globals.maxSize)) { [15:31:49.612] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.612] on.exit(options(oopts), add = TRUE) [15:31:49.612] } [15:31:49.612] { [15:31:49.612] lapply(seq_along(...future.elements_ii), [15:31:49.612] FUN = function(jj) { [15:31:49.612] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.612] ...future.FUN(...future.X_jj, ...) [15:31:49.612] }) [15:31:49.612] } [15:31:49.612] }, args = future.call.arguments) [15:31:49.612] })) [15:31:49.612] future::FutureResult(value = ...future.value$value, [15:31:49.612] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:49.612] ...future.rng), globalenv = if (FALSE) [15:31:49.612] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:49.612] ...future.globalenv.names)) [15:31:49.612] else NULL, started = ...future.startTime, version = "1.8") [15:31:49.612] }, condition = base::local({ [15:31:49.612] c <- base::c [15:31:49.612] inherits <- base::inherits [15:31:49.612] invokeRestart <- base::invokeRestart [15:31:49.612] length <- base::length [15:31:49.612] list <- base::list [15:31:49.612] seq.int <- base::seq.int [15:31:49.612] signalCondition <- base::signalCondition [15:31:49.612] sys.calls <- base::sys.calls [15:31:49.612] `[[` <- base::`[[` [15:31:49.612] `+` <- base::`+` [15:31:49.612] `<<-` <- base::`<<-` [15:31:49.612] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:49.612] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:49.612] 3L)] [15:31:49.612] } [15:31:49.612] function(cond) { [15:31:49.612] is_error <- inherits(cond, "error") [15:31:49.612] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:49.612] NULL) [15:31:49.612] if (is_error) { [15:31:49.612] sessionInformation <- function() { [15:31:49.612] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:49.612] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:49.612] search = base::search(), system = base::Sys.info()) [15:31:49.612] } [15:31:49.612] ...future.conditions[[length(...future.conditions) + [15:31:49.612] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:49.612] cond$call), session = sessionInformation(), [15:31:49.612] timestamp = base::Sys.time(), signaled = 0L) [15:31:49.612] signalCondition(cond) [15:31:49.612] } [15:31:49.612] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:49.612] "immediateCondition"))) { [15:31:49.612] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:49.612] ...future.conditions[[length(...future.conditions) + [15:31:49.612] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:49.612] if (TRUE && !signal) { [15:31:49.612] muffleCondition <- function (cond, pattern = "^muffle") [15:31:49.612] { [15:31:49.612] inherits <- base::inherits [15:31:49.612] invokeRestart <- base::invokeRestart [15:31:49.612] is.null <- base::is.null [15:31:49.612] muffled <- FALSE [15:31:49.612] if (inherits(cond, "message")) { [15:31:49.612] muffled <- grepl(pattern, "muffleMessage") [15:31:49.612] if (muffled) [15:31:49.612] invokeRestart("muffleMessage") [15:31:49.612] } [15:31:49.612] else if (inherits(cond, "warning")) { [15:31:49.612] muffled <- grepl(pattern, "muffleWarning") [15:31:49.612] if (muffled) [15:31:49.612] invokeRestart("muffleWarning") [15:31:49.612] } [15:31:49.612] else if (inherits(cond, "condition")) { [15:31:49.612] if (!is.null(pattern)) { [15:31:49.612] computeRestarts <- base::computeRestarts [15:31:49.612] grepl <- base::grepl [15:31:49.612] restarts <- computeRestarts(cond) [15:31:49.612] for (restart in restarts) { [15:31:49.612] name <- restart$name [15:31:49.612] if (is.null(name)) [15:31:49.612] next [15:31:49.612] if (!grepl(pattern, name)) [15:31:49.612] next [15:31:49.612] invokeRestart(restart) [15:31:49.612] muffled <- TRUE [15:31:49.612] break [15:31:49.612] } [15:31:49.612] } [15:31:49.612] } [15:31:49.612] invisible(muffled) [15:31:49.612] } [15:31:49.612] muffleCondition(cond, pattern = "^muffle") [15:31:49.612] } [15:31:49.612] } [15:31:49.612] else { [15:31:49.612] if (TRUE) { [15:31:49.612] muffleCondition <- function (cond, pattern = "^muffle") [15:31:49.612] { [15:31:49.612] inherits <- base::inherits [15:31:49.612] invokeRestart <- base::invokeRestart [15:31:49.612] is.null <- base::is.null [15:31:49.612] muffled <- FALSE [15:31:49.612] if (inherits(cond, "message")) { [15:31:49.612] muffled <- grepl(pattern, "muffleMessage") [15:31:49.612] if (muffled) [15:31:49.612] invokeRestart("muffleMessage") [15:31:49.612] } [15:31:49.612] else if (inherits(cond, "warning")) { [15:31:49.612] muffled <- grepl(pattern, "muffleWarning") [15:31:49.612] if (muffled) [15:31:49.612] invokeRestart("muffleWarning") [15:31:49.612] } [15:31:49.612] else if (inherits(cond, "condition")) { [15:31:49.612] if (!is.null(pattern)) { [15:31:49.612] computeRestarts <- base::computeRestarts [15:31:49.612] grepl <- base::grepl [15:31:49.612] restarts <- computeRestarts(cond) [15:31:49.612] for (restart in restarts) { [15:31:49.612] name <- restart$name [15:31:49.612] if (is.null(name)) [15:31:49.612] next [15:31:49.612] if (!grepl(pattern, name)) [15:31:49.612] next [15:31:49.612] invokeRestart(restart) [15:31:49.612] muffled <- TRUE [15:31:49.612] break [15:31:49.612] } [15:31:49.612] } [15:31:49.612] } [15:31:49.612] invisible(muffled) [15:31:49.612] } [15:31:49.612] muffleCondition(cond, pattern = "^muffle") [15:31:49.612] } [15:31:49.612] } [15:31:49.612] } [15:31:49.612] })) [15:31:49.612] }, error = function(ex) { [15:31:49.612] base::structure(base::list(value = NULL, visible = NULL, [15:31:49.612] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:49.612] ...future.rng), started = ...future.startTime, [15:31:49.612] finished = Sys.time(), session_uuid = NA_character_, [15:31:49.612] version = "1.8"), class = "FutureResult") [15:31:49.612] }, finally = { [15:31:49.612] if (!identical(...future.workdir, getwd())) [15:31:49.612] setwd(...future.workdir) [15:31:49.612] { [15:31:49.612] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:49.612] ...future.oldOptions$nwarnings <- NULL [15:31:49.612] } [15:31:49.612] base::options(...future.oldOptions) [15:31:49.612] if (.Platform$OS.type == "windows") { [15:31:49.612] old_names <- names(...future.oldEnvVars) [15:31:49.612] envs <- base::Sys.getenv() [15:31:49.612] names <- names(envs) [15:31:49.612] common <- intersect(names, old_names) [15:31:49.612] added <- setdiff(names, old_names) [15:31:49.612] removed <- setdiff(old_names, names) [15:31:49.612] changed <- common[...future.oldEnvVars[common] != [15:31:49.612] envs[common]] [15:31:49.612] NAMES <- toupper(changed) [15:31:49.612] args <- list() [15:31:49.612] for (kk in seq_along(NAMES)) { [15:31:49.612] name <- changed[[kk]] [15:31:49.612] NAME <- NAMES[[kk]] [15:31:49.612] if (name != NAME && is.element(NAME, old_names)) [15:31:49.612] next [15:31:49.612] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:49.612] } [15:31:49.612] NAMES <- toupper(added) [15:31:49.612] for (kk in seq_along(NAMES)) { [15:31:49.612] name <- added[[kk]] [15:31:49.612] NAME <- NAMES[[kk]] [15:31:49.612] if (name != NAME && is.element(NAME, old_names)) [15:31:49.612] next [15:31:49.612] args[[name]] <- "" [15:31:49.612] } [15:31:49.612] NAMES <- toupper(removed) [15:31:49.612] for (kk in seq_along(NAMES)) { [15:31:49.612] name <- removed[[kk]] [15:31:49.612] NAME <- NAMES[[kk]] [15:31:49.612] if (name != NAME && is.element(NAME, old_names)) [15:31:49.612] next [15:31:49.612] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:49.612] } [15:31:49.612] if (length(args) > 0) [15:31:49.612] base::do.call(base::Sys.setenv, args = args) [15:31:49.612] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:49.612] } [15:31:49.612] else { [15:31:49.612] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:49.612] } [15:31:49.612] { [15:31:49.612] if (base::length(...future.futureOptionsAdded) > [15:31:49.612] 0L) { [15:31:49.612] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:49.612] base::names(opts) <- ...future.futureOptionsAdded [15:31:49.612] base::options(opts) [15:31:49.612] } [15:31:49.612] { [15:31:49.612] { [15:31:49.612] NULL [15:31:49.612] RNGkind("Mersenne-Twister") [15:31:49.612] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:49.612] inherits = FALSE) [15:31:49.612] } [15:31:49.612] options(future.plan = NULL) [15:31:49.612] if (is.na(NA_character_)) [15:31:49.612] Sys.unsetenv("R_FUTURE_PLAN") [15:31:49.612] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:49.612] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:49.612] .init = FALSE) [15:31:49.612] } [15:31:49.612] } [15:31:49.612] } [15:31:49.612] }) [15:31:49.612] if (TRUE) { [15:31:49.612] base::sink(type = "output", split = FALSE) [15:31:49.612] if (TRUE) { [15:31:49.612] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:49.612] } [15:31:49.612] else { [15:31:49.612] ...future.result["stdout"] <- base::list(NULL) [15:31:49.612] } [15:31:49.612] base::close(...future.stdout) [15:31:49.612] ...future.stdout <- NULL [15:31:49.612] } [15:31:49.612] ...future.result$conditions <- ...future.conditions [15:31:49.612] ...future.result$finished <- base::Sys.time() [15:31:49.612] ...future.result [15:31:49.612] } [15:31:49.618] assign_globals() ... [15:31:49.619] List of 5 [15:31:49.619] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:49.619] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:49.619] $ future.call.arguments :List of 2 [15:31:49.619] ..$ collapse: chr "; " [15:31:49.619] ..$ maxHead : int 3 [15:31:49.619] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.619] $ ...future.elements_ii :List of 1 [15:31:49.619] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [15:31:49.619] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [15:31:49.619] $ ...future.seeds_ii : NULL [15:31:49.619] $ ...future.globals.maxSize: NULL [15:31:49.619] - attr(*, "where")=List of 5 [15:31:49.619] ..$ ...future.FUN : [15:31:49.619] ..$ future.call.arguments : [15:31:49.619] ..$ ...future.elements_ii : [15:31:49.619] ..$ ...future.seeds_ii : [15:31:49.619] ..$ ...future.globals.maxSize: [15:31:49.619] - attr(*, "resolved")= logi FALSE [15:31:49.619] - attr(*, "total_size")= num 71456 [15:31:49.619] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.619] - attr(*, "already-done")= logi TRUE [15:31:49.631] - copied '...future.FUN' to environment [15:31:49.632] - copied 'future.call.arguments' to environment [15:31:49.632] - copied '...future.elements_ii' to environment [15:31:49.632] - copied '...future.seeds_ii' to environment [15:31:49.632] - copied '...future.globals.maxSize' to environment [15:31:49.633] assign_globals() ... done [15:31:49.634] plan(): Setting new future strategy stack: [15:31:49.634] List of future strategies: [15:31:49.634] 1. sequential: [15:31:49.634] - args: function (..., envir = parent.frame(), workers = "") [15:31:49.634] - tweaked: FALSE [15:31:49.634] - call: NULL [15:31:49.635] plan(): nbrOfWorkers() = 1 [15:31:49.637] plan(): Setting new future strategy stack: [15:31:49.638] List of future strategies: [15:31:49.638] 1. multisession: [15:31:49.638] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:49.638] - tweaked: FALSE [15:31:49.638] - call: plan(strategy) [15:31:49.642] plan(): nbrOfWorkers() = 1 [15:31:49.642] SequentialFuture started (and completed) [15:31:49.643] - Launch lazy future ... done [15:31:49.643] run() for 'SequentialFuture' ... done [15:31:49.644] Created future: [15:31:49.644] SequentialFuture: [15:31:49.644] Label: 'future_lapply-1' [15:31:49.644] Expression: [15:31:49.644] { [15:31:49.644] do.call(function(...) { [15:31:49.644] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.644] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:49.644] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.644] on.exit(options(oopts), add = TRUE) [15:31:49.644] } [15:31:49.644] { [15:31:49.644] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:49.644] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.644] ...future.FUN(...future.X_jj, ...) [15:31:49.644] }) [15:31:49.644] } [15:31:49.644] }, args = future.call.arguments) [15:31:49.644] } [15:31:49.644] Lazy evaluation: FALSE [15:31:49.644] Asynchronous evaluation: FALSE [15:31:49.644] Local evaluation: TRUE [15:31:49.644] Environment: R_GlobalEnv [15:31:49.644] Capture standard output: TRUE [15:31:49.644] Capture condition classes: 'condition' (excluding 'nothing') [15:31:49.644] Globals: 5 objects totaling 82.61 KiB (function '...future.FUN' of 69.62 KiB, DotDotDotList 'future.call.arguments' of 168 bytes, list '...future.elements_ii' of 12.83 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:49.644] Packages: 1 packages ('future') [15:31:49.644] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:49.644] Resolved: TRUE [15:31:49.644] Value: 136 bytes of class 'list' [15:31:49.644] Early signaling: FALSE [15:31:49.644] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:49.644] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:49.647] Chunk #1 of 1 ... DONE [15:31:49.647] Launching 1 futures (chunks) ... DONE [15:31:49.647] Resolving 1 futures (chunks) ... [15:31:49.648] resolve() on list ... [15:31:49.648] recursive: 0 [15:31:49.648] length: 1 [15:31:49.648] [15:31:49.649] resolved() for 'SequentialFuture' ... [15:31:49.649] - state: 'finished' [15:31:49.649] - run: TRUE [15:31:49.649] - result: 'FutureResult' [15:31:49.650] resolved() for 'SequentialFuture' ... done [15:31:49.650] Future #1 [15:31:49.650] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:49.651] - nx: 1 [15:31:49.651] - relay: TRUE [15:31:49.651] - stdout: TRUE [15:31:49.651] - signal: TRUE [15:31:49.652] - resignal: FALSE [15:31:49.652] - force: TRUE [15:31:49.652] - relayed: [n=1] FALSE [15:31:49.652] - queued futures: [n=1] FALSE [15:31:49.653] - until=1 [15:31:49.653] - relaying element #1 [15:31:49.654] - relayed: [n=1] TRUE [15:31:49.654] - queued futures: [n=1] TRUE [15:31:49.654] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:49.654] length: 0 (resolved future 1) [15:31:49.655] Relaying remaining futures [15:31:49.655] signalConditionsASAP(NULL, pos=0) ... [15:31:49.655] - nx: 1 [15:31:49.656] - relay: TRUE [15:31:49.656] - stdout: TRUE [15:31:49.656] - signal: TRUE [15:31:49.656] - resignal: FALSE [15:31:49.657] - force: TRUE [15:31:49.657] - relayed: [n=1] TRUE [15:31:49.657] - queued futures: [n=1] TRUE - flush all [15:31:49.658] - relayed: [n=1] TRUE [15:31:49.658] - queued futures: [n=1] TRUE [15:31:49.658] signalConditionsASAP(NULL, pos=0) ... done [15:31:49.658] resolve() on list ... DONE [15:31:49.659] - Number of value chunks collected: 1 [15:31:49.659] Resolving 1 futures (chunks) ... DONE [15:31:49.659] Reducing values from 1 chunks ... [15:31:49.660] - Number of values collected after concatenation: 1 [15:31:49.660] - Number of values expected: 1 [15:31:49.660] Reducing values from 1 chunks ... DONE [15:31:49.661] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [15:31:49.663] future_lapply() ... [15:31:49.668] Number of chunks: 1 [15:31:49.668] getGlobalsAndPackagesXApply() ... [15:31:49.669] - future.globals: TRUE [15:31:49.669] getGlobalsAndPackages() ... [15:31:49.669] Searching for globals... [15:31:49.672] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [15:31:49.672] Searching for globals ... DONE [15:31:49.673] Resolving globals: FALSE [15:31:49.674] The total size of the 1 globals is 4.85 KiB (4968 bytes) [15:31:49.674] The total size of the 1 globals exported for future expression ('FUN()') is 4.85 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (4.85 KiB of class 'function') [15:31:49.675] - globals: [1] 'FUN' [15:31:49.675] - packages: [1] 'listenv' [15:31:49.675] getGlobalsAndPackages() ... DONE [15:31:49.676] - globals found/used: [n=1] 'FUN' [15:31:49.676] - needed namespaces: [n=1] 'listenv' [15:31:49.676] Finding globals ... DONE [15:31:49.677] - use_args: TRUE [15:31:49.677] - Getting '...' globals ... [15:31:49.678] resolve() on list ... [15:31:49.678] recursive: 0 [15:31:49.678] length: 1 [15:31:49.678] elements: '...' [15:31:49.679] length: 0 (resolved future 1) [15:31:49.679] resolve() on list ... DONE [15:31:49.679] - '...' content: [n=0] [15:31:49.680] List of 1 [15:31:49.680] $ ...: list() [15:31:49.680] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.680] - attr(*, "where")=List of 1 [15:31:49.680] ..$ ...: [15:31:49.680] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.680] - attr(*, "resolved")= logi TRUE [15:31:49.680] - attr(*, "total_size")= num NA [15:31:49.685] - Getting '...' globals ... DONE [15:31:49.686] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:49.686] List of 2 [15:31:49.686] $ ...future.FUN:function (x, ...) [15:31:49.686] $ ... : list() [15:31:49.686] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.686] - attr(*, "where")=List of 2 [15:31:49.686] ..$ ...future.FUN: [15:31:49.686] ..$ ... : [15:31:49.686] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.686] - attr(*, "resolved")= logi FALSE [15:31:49.686] - attr(*, "total_size")= num 4968 [15:31:49.690] Packages to be attached in all futures: [n=1] 'listenv' [15:31:49.691] getGlobalsAndPackagesXApply() ... DONE [15:31:49.691] Number of futures (= number of chunks): 1 [15:31:49.691] Launching 1 futures (chunks) ... [15:31:49.692] Chunk #1 of 1 ... [15:31:49.692] - Finding globals in 'X' for chunk #1 ... [15:31:49.692] getGlobalsAndPackages() ... [15:31:49.693] Searching for globals... [15:31:49.693] [15:31:49.694] Searching for globals ... DONE [15:31:49.694] - globals: [0] [15:31:49.694] getGlobalsAndPackages() ... DONE [15:31:49.694] + additional globals found: [n=0] [15:31:49.694] + additional namespaces needed: [n=0] [15:31:49.694] - Finding globals in 'X' for chunk #1 ... DONE [15:31:49.695] - seeds: [15:31:49.695] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.695] getGlobalsAndPackages() ... [15:31:49.696] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.696] Resolving globals: FALSE [15:31:49.696] Tweak future expression to call with '...' arguments ... [15:31:49.697] { [15:31:49.697] do.call(function(...) { [15:31:49.697] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.697] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:49.697] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.697] on.exit(options(oopts), add = TRUE) [15:31:49.697] } [15:31:49.697] { [15:31:49.697] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:49.697] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.697] ...future.FUN(...future.X_jj, ...) [15:31:49.697] }) [15:31:49.697] } [15:31:49.697] }, args = future.call.arguments) [15:31:49.697] } [15:31:49.697] Tweak future expression to call with '...' arguments ... DONE [15:31:49.698] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.698] - packages: [1] 'listenv' [15:31:49.699] getGlobalsAndPackages() ... DONE [15:31:49.699] run() for 'Future' ... [15:31:49.699] - state: 'created' [15:31:49.700] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:49.702] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:49.703] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:49.703] - Field: 'label' [15:31:49.703] - Field: 'local' [15:31:49.704] - Field: 'owner' [15:31:49.704] - Field: 'envir' [15:31:49.704] - Field: 'packages' [15:31:49.704] - Field: 'gc' [15:31:49.705] - Field: 'conditions' [15:31:49.705] - Field: 'expr' [15:31:49.705] - Field: 'uuid' [15:31:49.705] - Field: 'seed' [15:31:49.706] - Field: 'version' [15:31:49.706] - Field: 'result' [15:31:49.706] - Field: 'asynchronous' [15:31:49.707] - Field: 'calls' [15:31:49.707] - Field: 'globals' [15:31:49.707] - Field: 'stdout' [15:31:49.707] - Field: 'earlySignal' [15:31:49.708] - Field: 'lazy' [15:31:49.708] - Field: 'state' [15:31:49.708] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:49.709] - Launch lazy future ... [15:31:49.709] Packages needed by the future expression (n = 1): 'listenv' [15:31:49.709] Packages needed by future strategies (n = 0): [15:31:49.711] { [15:31:49.711] { [15:31:49.711] { [15:31:49.711] ...future.startTime <- base::Sys.time() [15:31:49.711] { [15:31:49.711] { [15:31:49.711] { [15:31:49.711] { [15:31:49.711] base::local({ [15:31:49.711] has_future <- base::requireNamespace("future", [15:31:49.711] quietly = TRUE) [15:31:49.711] if (has_future) { [15:31:49.711] ns <- base::getNamespace("future") [15:31:49.711] version <- ns[[".package"]][["version"]] [15:31:49.711] if (is.null(version)) [15:31:49.711] version <- utils::packageVersion("future") [15:31:49.711] } [15:31:49.711] else { [15:31:49.711] version <- NULL [15:31:49.711] } [15:31:49.711] if (!has_future || version < "1.8.0") { [15:31:49.711] info <- base::c(r_version = base::gsub("R version ", [15:31:49.711] "", base::R.version$version.string), [15:31:49.711] platform = base::sprintf("%s (%s-bit)", [15:31:49.711] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:49.711] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:49.711] "release", "version")], collapse = " "), [15:31:49.711] hostname = base::Sys.info()[["nodename"]]) [15:31:49.711] info <- base::sprintf("%s: %s", base::names(info), [15:31:49.711] info) [15:31:49.711] info <- base::paste(info, collapse = "; ") [15:31:49.711] if (!has_future) { [15:31:49.711] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:49.711] info) [15:31:49.711] } [15:31:49.711] else { [15:31:49.711] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:49.711] info, version) [15:31:49.711] } [15:31:49.711] base::stop(msg) [15:31:49.711] } [15:31:49.711] }) [15:31:49.711] } [15:31:49.711] base::local({ [15:31:49.711] for (pkg in "listenv") { [15:31:49.711] base::loadNamespace(pkg) [15:31:49.711] base::library(pkg, character.only = TRUE) [15:31:49.711] } [15:31:49.711] }) [15:31:49.711] } [15:31:49.711] ...future.strategy.old <- future::plan("list") [15:31:49.711] options(future.plan = NULL) [15:31:49.711] Sys.unsetenv("R_FUTURE_PLAN") [15:31:49.711] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:49.711] } [15:31:49.711] ...future.workdir <- getwd() [15:31:49.711] } [15:31:49.711] ...future.oldOptions <- base::as.list(base::.Options) [15:31:49.711] ...future.oldEnvVars <- base::Sys.getenv() [15:31:49.711] } [15:31:49.711] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:49.711] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:49.711] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:49.711] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:49.711] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:49.711] future.stdout.windows.reencode = NULL, width = 80L) [15:31:49.711] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:49.711] base::names(...future.oldOptions)) [15:31:49.711] } [15:31:49.711] if (FALSE) { [15:31:49.711] } [15:31:49.711] else { [15:31:49.711] if (TRUE) { [15:31:49.711] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:49.711] open = "w") [15:31:49.711] } [15:31:49.711] else { [15:31:49.711] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:49.711] windows = "NUL", "/dev/null"), open = "w") [15:31:49.711] } [15:31:49.711] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:49.711] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:49.711] base::sink(type = "output", split = FALSE) [15:31:49.711] base::close(...future.stdout) [15:31:49.711] }, add = TRUE) [15:31:49.711] } [15:31:49.711] ...future.frame <- base::sys.nframe() [15:31:49.711] ...future.conditions <- base::list() [15:31:49.711] ...future.rng <- base::globalenv()$.Random.seed [15:31:49.711] if (FALSE) { [15:31:49.711] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:49.711] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:49.711] } [15:31:49.711] ...future.result <- base::tryCatch({ [15:31:49.711] base::withCallingHandlers({ [15:31:49.711] ...future.value <- base::withVisible(base::local({ [15:31:49.711] do.call(function(...) { [15:31:49.711] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.711] if (!identical(...future.globals.maxSize.org, [15:31:49.711] ...future.globals.maxSize)) { [15:31:49.711] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.711] on.exit(options(oopts), add = TRUE) [15:31:49.711] } [15:31:49.711] { [15:31:49.711] lapply(seq_along(...future.elements_ii), [15:31:49.711] FUN = function(jj) { [15:31:49.711] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.711] ...future.FUN(...future.X_jj, ...) [15:31:49.711] }) [15:31:49.711] } [15:31:49.711] }, args = future.call.arguments) [15:31:49.711] })) [15:31:49.711] future::FutureResult(value = ...future.value$value, [15:31:49.711] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:49.711] ...future.rng), globalenv = if (FALSE) [15:31:49.711] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:49.711] ...future.globalenv.names)) [15:31:49.711] else NULL, started = ...future.startTime, version = "1.8") [15:31:49.711] }, condition = base::local({ [15:31:49.711] c <- base::c [15:31:49.711] inherits <- base::inherits [15:31:49.711] invokeRestart <- base::invokeRestart [15:31:49.711] length <- base::length [15:31:49.711] list <- base::list [15:31:49.711] seq.int <- base::seq.int [15:31:49.711] signalCondition <- base::signalCondition [15:31:49.711] sys.calls <- base::sys.calls [15:31:49.711] `[[` <- base::`[[` [15:31:49.711] `+` <- base::`+` [15:31:49.711] `<<-` <- base::`<<-` [15:31:49.711] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:49.711] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:49.711] 3L)] [15:31:49.711] } [15:31:49.711] function(cond) { [15:31:49.711] is_error <- inherits(cond, "error") [15:31:49.711] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:49.711] NULL) [15:31:49.711] if (is_error) { [15:31:49.711] sessionInformation <- function() { [15:31:49.711] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:49.711] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:49.711] search = base::search(), system = base::Sys.info()) [15:31:49.711] } [15:31:49.711] ...future.conditions[[length(...future.conditions) + [15:31:49.711] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:49.711] cond$call), session = sessionInformation(), [15:31:49.711] timestamp = base::Sys.time(), signaled = 0L) [15:31:49.711] signalCondition(cond) [15:31:49.711] } [15:31:49.711] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:49.711] "immediateCondition"))) { [15:31:49.711] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:49.711] ...future.conditions[[length(...future.conditions) + [15:31:49.711] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:49.711] if (TRUE && !signal) { [15:31:49.711] muffleCondition <- function (cond, pattern = "^muffle") [15:31:49.711] { [15:31:49.711] inherits <- base::inherits [15:31:49.711] invokeRestart <- base::invokeRestart [15:31:49.711] is.null <- base::is.null [15:31:49.711] muffled <- FALSE [15:31:49.711] if (inherits(cond, "message")) { [15:31:49.711] muffled <- grepl(pattern, "muffleMessage") [15:31:49.711] if (muffled) [15:31:49.711] invokeRestart("muffleMessage") [15:31:49.711] } [15:31:49.711] else if (inherits(cond, "warning")) { [15:31:49.711] muffled <- grepl(pattern, "muffleWarning") [15:31:49.711] if (muffled) [15:31:49.711] invokeRestart("muffleWarning") [15:31:49.711] } [15:31:49.711] else if (inherits(cond, "condition")) { [15:31:49.711] if (!is.null(pattern)) { [15:31:49.711] computeRestarts <- base::computeRestarts [15:31:49.711] grepl <- base::grepl [15:31:49.711] restarts <- computeRestarts(cond) [15:31:49.711] for (restart in restarts) { [15:31:49.711] name <- restart$name [15:31:49.711] if (is.null(name)) [15:31:49.711] next [15:31:49.711] if (!grepl(pattern, name)) [15:31:49.711] next [15:31:49.711] invokeRestart(restart) [15:31:49.711] muffled <- TRUE [15:31:49.711] break [15:31:49.711] } [15:31:49.711] } [15:31:49.711] } [15:31:49.711] invisible(muffled) [15:31:49.711] } [15:31:49.711] muffleCondition(cond, pattern = "^muffle") [15:31:49.711] } [15:31:49.711] } [15:31:49.711] else { [15:31:49.711] if (TRUE) { [15:31:49.711] muffleCondition <- function (cond, pattern = "^muffle") [15:31:49.711] { [15:31:49.711] inherits <- base::inherits [15:31:49.711] invokeRestart <- base::invokeRestart [15:31:49.711] is.null <- base::is.null [15:31:49.711] muffled <- FALSE [15:31:49.711] if (inherits(cond, "message")) { [15:31:49.711] muffled <- grepl(pattern, "muffleMessage") [15:31:49.711] if (muffled) [15:31:49.711] invokeRestart("muffleMessage") [15:31:49.711] } [15:31:49.711] else if (inherits(cond, "warning")) { [15:31:49.711] muffled <- grepl(pattern, "muffleWarning") [15:31:49.711] if (muffled) [15:31:49.711] invokeRestart("muffleWarning") [15:31:49.711] } [15:31:49.711] else if (inherits(cond, "condition")) { [15:31:49.711] if (!is.null(pattern)) { [15:31:49.711] computeRestarts <- base::computeRestarts [15:31:49.711] grepl <- base::grepl [15:31:49.711] restarts <- computeRestarts(cond) [15:31:49.711] for (restart in restarts) { [15:31:49.711] name <- restart$name [15:31:49.711] if (is.null(name)) [15:31:49.711] next [15:31:49.711] if (!grepl(pattern, name)) [15:31:49.711] next [15:31:49.711] invokeRestart(restart) [15:31:49.711] muffled <- TRUE [15:31:49.711] break [15:31:49.711] } [15:31:49.711] } [15:31:49.711] } [15:31:49.711] invisible(muffled) [15:31:49.711] } [15:31:49.711] muffleCondition(cond, pattern = "^muffle") [15:31:49.711] } [15:31:49.711] } [15:31:49.711] } [15:31:49.711] })) [15:31:49.711] }, error = function(ex) { [15:31:49.711] base::structure(base::list(value = NULL, visible = NULL, [15:31:49.711] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:49.711] ...future.rng), started = ...future.startTime, [15:31:49.711] finished = Sys.time(), session_uuid = NA_character_, [15:31:49.711] version = "1.8"), class = "FutureResult") [15:31:49.711] }, finally = { [15:31:49.711] if (!identical(...future.workdir, getwd())) [15:31:49.711] setwd(...future.workdir) [15:31:49.711] { [15:31:49.711] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:49.711] ...future.oldOptions$nwarnings <- NULL [15:31:49.711] } [15:31:49.711] base::options(...future.oldOptions) [15:31:49.711] if (.Platform$OS.type == "windows") { [15:31:49.711] old_names <- names(...future.oldEnvVars) [15:31:49.711] envs <- base::Sys.getenv() [15:31:49.711] names <- names(envs) [15:31:49.711] common <- intersect(names, old_names) [15:31:49.711] added <- setdiff(names, old_names) [15:31:49.711] removed <- setdiff(old_names, names) [15:31:49.711] changed <- common[...future.oldEnvVars[common] != [15:31:49.711] envs[common]] [15:31:49.711] NAMES <- toupper(changed) [15:31:49.711] args <- list() [15:31:49.711] for (kk in seq_along(NAMES)) { [15:31:49.711] name <- changed[[kk]] [15:31:49.711] NAME <- NAMES[[kk]] [15:31:49.711] if (name != NAME && is.element(NAME, old_names)) [15:31:49.711] next [15:31:49.711] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:49.711] } [15:31:49.711] NAMES <- toupper(added) [15:31:49.711] for (kk in seq_along(NAMES)) { [15:31:49.711] name <- added[[kk]] [15:31:49.711] NAME <- NAMES[[kk]] [15:31:49.711] if (name != NAME && is.element(NAME, old_names)) [15:31:49.711] next [15:31:49.711] args[[name]] <- "" [15:31:49.711] } [15:31:49.711] NAMES <- toupper(removed) [15:31:49.711] for (kk in seq_along(NAMES)) { [15:31:49.711] name <- removed[[kk]] [15:31:49.711] NAME <- NAMES[[kk]] [15:31:49.711] if (name != NAME && is.element(NAME, old_names)) [15:31:49.711] next [15:31:49.711] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:49.711] } [15:31:49.711] if (length(args) > 0) [15:31:49.711] base::do.call(base::Sys.setenv, args = args) [15:31:49.711] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:49.711] } [15:31:49.711] else { [15:31:49.711] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:49.711] } [15:31:49.711] { [15:31:49.711] if (base::length(...future.futureOptionsAdded) > [15:31:49.711] 0L) { [15:31:49.711] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:49.711] base::names(opts) <- ...future.futureOptionsAdded [15:31:49.711] base::options(opts) [15:31:49.711] } [15:31:49.711] { [15:31:49.711] { [15:31:49.711] NULL [15:31:49.711] RNGkind("Mersenne-Twister") [15:31:49.711] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:49.711] inherits = FALSE) [15:31:49.711] } [15:31:49.711] options(future.plan = NULL) [15:31:49.711] if (is.na(NA_character_)) [15:31:49.711] Sys.unsetenv("R_FUTURE_PLAN") [15:31:49.711] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:49.711] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:49.711] .init = FALSE) [15:31:49.711] } [15:31:49.711] } [15:31:49.711] } [15:31:49.711] }) [15:31:49.711] if (TRUE) { [15:31:49.711] base::sink(type = "output", split = FALSE) [15:31:49.711] if (TRUE) { [15:31:49.711] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:49.711] } [15:31:49.711] else { [15:31:49.711] ...future.result["stdout"] <- base::list(NULL) [15:31:49.711] } [15:31:49.711] base::close(...future.stdout) [15:31:49.711] ...future.stdout <- NULL [15:31:49.711] } [15:31:49.711] ...future.result$conditions <- ...future.conditions [15:31:49.711] ...future.result$finished <- base::Sys.time() [15:31:49.711] ...future.result [15:31:49.711] } [15:31:49.717] assign_globals() ... [15:31:49.718] List of 5 [15:31:49.718] $ ...future.FUN :function (x, ...) [15:31:49.718] $ future.call.arguments : list() [15:31:49.718] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.718] $ ...future.elements_ii :List of 2 [15:31:49.718] ..$ a:Classes 'listenv', 'environment' [15:31:49.718] ..$ b:Classes 'listenv', 'environment' [15:31:49.718] $ ...future.seeds_ii : NULL [15:31:49.718] $ ...future.globals.maxSize: NULL [15:31:49.718] - attr(*, "where")=List of 5 [15:31:49.718] ..$ ...future.FUN : [15:31:49.718] ..$ future.call.arguments : [15:31:49.718] ..$ ...future.elements_ii : [15:31:49.718] ..$ ...future.seeds_ii : [15:31:49.718] ..$ ...future.globals.maxSize: [15:31:49.718] - attr(*, "resolved")= logi FALSE [15:31:49.718] - attr(*, "total_size")= num 4968 [15:31:49.718] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.718] - attr(*, "already-done")= logi TRUE [15:31:49.724] - copied '...future.FUN' to environment [15:31:49.724] - copied 'future.call.arguments' to environment [15:31:49.724] - copied '...future.elements_ii' to environment [15:31:49.725] - copied '...future.seeds_ii' to environment [15:31:49.725] - copied '...future.globals.maxSize' to environment [15:31:49.725] assign_globals() ... done [15:31:49.730] plan(): Setting new future strategy stack: [15:31:49.730] List of future strategies: [15:31:49.730] 1. sequential: [15:31:49.730] - args: function (..., envir = parent.frame(), workers = "") [15:31:49.730] - tweaked: FALSE [15:31:49.730] - call: NULL [15:31:49.730] plan(): nbrOfWorkers() = 1 [15:31:49.732] plan(): Setting new future strategy stack: [15:31:49.732] List of future strategies: [15:31:49.732] 1. multisession: [15:31:49.732] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:49.732] - tweaked: FALSE [15:31:49.732] - call: plan(strategy) [15:31:49.735] plan(): nbrOfWorkers() = 1 [15:31:49.735] SequentialFuture started (and completed) [15:31:49.736] - Launch lazy future ... done [15:31:49.736] run() for 'SequentialFuture' ... done [15:31:49.736] Created future: [15:31:49.736] SequentialFuture: [15:31:49.736] Label: 'future_lapply-1' [15:31:49.736] Expression: [15:31:49.736] { [15:31:49.736] do.call(function(...) { [15:31:49.736] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.736] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:49.736] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.736] on.exit(options(oopts), add = TRUE) [15:31:49.736] } [15:31:49.736] { [15:31:49.736] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:49.736] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.736] ...future.FUN(...future.X_jj, ...) [15:31:49.736] }) [15:31:49.736] } [15:31:49.736] }, args = future.call.arguments) [15:31:49.736] } [15:31:49.736] Lazy evaluation: FALSE [15:31:49.736] Asynchronous evaluation: FALSE [15:31:49.736] Local evaluation: TRUE [15:31:49.736] Environment: R_GlobalEnv [15:31:49.736] Capture standard output: TRUE [15:31:49.736] Capture condition classes: 'condition' (excluding 'nothing') [15:31:49.736] Globals: 5 objects totaling 17.90 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 13.05 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:49.736] Packages: 1 packages ('listenv') [15:31:49.736] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:49.736] Resolved: TRUE [15:31:49.736] Value: 800 bytes of class 'list' [15:31:49.736] Early signaling: FALSE [15:31:49.736] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:49.736] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:49.739] Chunk #1 of 1 ... DONE [15:31:49.739] Launching 1 futures (chunks) ... DONE [15:31:49.739] Resolving 1 futures (chunks) ... [15:31:49.739] resolve() on list ... [15:31:49.740] recursive: 0 [15:31:49.740] length: 1 [15:31:49.740] [15:31:49.740] resolved() for 'SequentialFuture' ... [15:31:49.741] - state: 'finished' [15:31:49.741] - run: TRUE [15:31:49.741] - result: 'FutureResult' [15:31:49.742] resolved() for 'SequentialFuture' ... done [15:31:49.742] Future #1 [15:31:49.742] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:49.743] - nx: 1 [15:31:49.743] - relay: TRUE [15:31:49.743] - stdout: TRUE [15:31:49.743] - signal: TRUE [15:31:49.744] - resignal: FALSE [15:31:49.744] - force: TRUE [15:31:49.744] - relayed: [n=1] FALSE [15:31:49.744] - queued futures: [n=1] FALSE [15:31:49.745] - until=1 [15:31:49.745] - relaying element #1 [15:31:49.745] - relayed: [n=1] TRUE [15:31:49.745] - queued futures: [n=1] TRUE [15:31:49.746] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:49.746] length: 0 (resolved future 1) [15:31:49.746] Relaying remaining futures [15:31:49.746] signalConditionsASAP(NULL, pos=0) ... [15:31:49.746] - nx: 1 [15:31:49.746] - relay: TRUE [15:31:49.747] - stdout: TRUE [15:31:49.747] - signal: TRUE [15:31:49.747] - resignal: FALSE [15:31:49.747] - force: TRUE [15:31:49.747] - relayed: [n=1] TRUE [15:31:49.747] - queued futures: [n=1] TRUE - flush all [15:31:49.748] - relayed: [n=1] TRUE [15:31:49.748] - queued futures: [n=1] TRUE [15:31:49.748] signalConditionsASAP(NULL, pos=0) ... done [15:31:49.748] resolve() on list ... DONE [15:31:49.749] - Number of value chunks collected: 1 [15:31:49.749] Resolving 1 futures (chunks) ... DONE [15:31:49.749] Reducing values from 1 chunks ... [15:31:49.750] - Number of values collected after concatenation: 2 [15:31:49.750] - Number of values expected: 2 [15:31:49.750] Reducing values from 1 chunks ... DONE [15:31:49.751] 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, ...) ... [15:31:49.755] future_lapply() ... [15:31:49.761] Number of chunks: 1 [15:31:49.761] Index remapping (attribute 'ordering'): [n = 4] 2, 3, 1, 4 [15:31:49.762] getGlobalsAndPackagesXApply() ... [15:31:49.762] - future.globals: TRUE [15:31:49.762] getGlobalsAndPackages() ... [15:31:49.763] Searching for globals... [15:31:49.766] - globals found: [2] 'FUN', '.Internal' [15:31:49.766] Searching for globals ... DONE [15:31:49.766] Resolving globals: FALSE [15:31:49.767] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:49.768] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:49.769] - globals: [1] 'FUN' [15:31:49.769] [15:31:49.769] getGlobalsAndPackages() ... DONE [15:31:49.770] - globals found/used: [n=1] 'FUN' [15:31:49.770] - needed namespaces: [n=0] [15:31:49.770] Finding globals ... DONE [15:31:49.771] - use_args: TRUE [15:31:49.771] - Getting '...' globals ... [15:31:49.772] resolve() on list ... [15:31:49.772] recursive: 0 [15:31:49.773] length: 1 [15:31:49.773] elements: '...' [15:31:49.774] length: 0 (resolved future 1) [15:31:49.774] resolve() on list ... DONE [15:31:49.774] - '...' content: [n=1] 'length' [15:31:49.775] List of 1 [15:31:49.775] $ ...:List of 1 [15:31:49.775] ..$ length: int 2 [15:31:49.775] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.775] - attr(*, "where")=List of 1 [15:31:49.775] ..$ ...: [15:31:49.775] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.775] - attr(*, "resolved")= logi TRUE [15:31:49.775] - attr(*, "total_size")= num NA [15:31:49.782] - Getting '...' globals ... DONE [15:31:49.782] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:49.783] List of 2 [15:31:49.783] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:49.783] $ ... :List of 1 [15:31:49.783] ..$ length: int 2 [15:31:49.783] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.783] - attr(*, "where")=List of 2 [15:31:49.783] ..$ ...future.FUN: [15:31:49.783] ..$ ... : [15:31:49.783] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.783] - attr(*, "resolved")= logi FALSE [15:31:49.783] - attr(*, "total_size")= num 2240 [15:31:49.790] Packages to be attached in all futures: [n=0] [15:31:49.790] getGlobalsAndPackagesXApply() ... DONE [15:31:49.791] Number of futures (= number of chunks): 1 [15:31:49.791] Launching 1 futures (chunks) ... [15:31:49.791] Chunk #1 of 1 ... [15:31:49.792] - Finding globals in 'X' for chunk #1 ... [15:31:49.792] getGlobalsAndPackages() ... [15:31:49.792] Searching for globals... [15:31:49.793] [15:31:49.794] Searching for globals ... DONE [15:31:49.794] - globals: [0] [15:31:49.794] getGlobalsAndPackages() ... DONE [15:31:49.794] + additional globals found: [n=0] [15:31:49.795] + additional namespaces needed: [n=0] [15:31:49.795] - Finding globals in 'X' for chunk #1 ... DONE [15:31:49.795] - seeds: [15:31:49.796] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.796] getGlobalsAndPackages() ... [15:31:49.796] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.797] Resolving globals: FALSE [15:31:49.797] Tweak future expression to call with '...' arguments ... [15:31:49.797] { [15:31:49.797] do.call(function(...) { [15:31:49.797] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.797] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:49.797] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.797] on.exit(options(oopts), add = TRUE) [15:31:49.797] } [15:31:49.797] { [15:31:49.797] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:49.797] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.797] ...future.FUN(...future.X_jj, ...) [15:31:49.797] }) [15:31:49.797] } [15:31:49.797] }, args = future.call.arguments) [15:31:49.797] } [15:31:49.798] Tweak future expression to call with '...' arguments ... DONE [15:31:49.799] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.800] [15:31:49.800] getGlobalsAndPackages() ... DONE [15:31:49.801] run() for 'Future' ... [15:31:49.801] - state: 'created' [15:31:49.802] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:49.807] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:49.807] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:49.807] - Field: 'label' [15:31:49.808] - Field: 'local' [15:31:49.808] - Field: 'owner' [15:31:49.808] - Field: 'envir' [15:31:49.809] - Field: 'packages' [15:31:49.809] - Field: 'gc' [15:31:49.809] - Field: 'conditions' [15:31:49.810] - Field: 'expr' [15:31:49.810] - Field: 'uuid' [15:31:49.810] - Field: 'seed' [15:31:49.811] - Field: 'version' [15:31:49.811] - Field: 'result' [15:31:49.812] - Field: 'asynchronous' [15:31:49.812] - Field: 'calls' [15:31:49.812] - Field: 'globals' [15:31:49.813] - Field: 'stdout' [15:31:49.813] - Field: 'earlySignal' [15:31:49.813] - Field: 'lazy' [15:31:49.814] - Field: 'state' [15:31:49.814] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:49.814] - Launch lazy future ... [15:31:49.815] Packages needed by the future expression (n = 0): [15:31:49.815] Packages needed by future strategies (n = 0): [15:31:49.816] { [15:31:49.816] { [15:31:49.816] { [15:31:49.816] ...future.startTime <- base::Sys.time() [15:31:49.816] { [15:31:49.816] { [15:31:49.816] { [15:31:49.816] base::local({ [15:31:49.816] has_future <- base::requireNamespace("future", [15:31:49.816] quietly = TRUE) [15:31:49.816] if (has_future) { [15:31:49.816] ns <- base::getNamespace("future") [15:31:49.816] version <- ns[[".package"]][["version"]] [15:31:49.816] if (is.null(version)) [15:31:49.816] version <- utils::packageVersion("future") [15:31:49.816] } [15:31:49.816] else { [15:31:49.816] version <- NULL [15:31:49.816] } [15:31:49.816] if (!has_future || version < "1.8.0") { [15:31:49.816] info <- base::c(r_version = base::gsub("R version ", [15:31:49.816] "", base::R.version$version.string), [15:31:49.816] platform = base::sprintf("%s (%s-bit)", [15:31:49.816] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:49.816] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:49.816] "release", "version")], collapse = " "), [15:31:49.816] hostname = base::Sys.info()[["nodename"]]) [15:31:49.816] info <- base::sprintf("%s: %s", base::names(info), [15:31:49.816] info) [15:31:49.816] info <- base::paste(info, collapse = "; ") [15:31:49.816] if (!has_future) { [15:31:49.816] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:49.816] info) [15:31:49.816] } [15:31:49.816] else { [15:31:49.816] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:49.816] info, version) [15:31:49.816] } [15:31:49.816] base::stop(msg) [15:31:49.816] } [15:31:49.816] }) [15:31:49.816] } [15:31:49.816] ...future.strategy.old <- future::plan("list") [15:31:49.816] options(future.plan = NULL) [15:31:49.816] Sys.unsetenv("R_FUTURE_PLAN") [15:31:49.816] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:49.816] } [15:31:49.816] ...future.workdir <- getwd() [15:31:49.816] } [15:31:49.816] ...future.oldOptions <- base::as.list(base::.Options) [15:31:49.816] ...future.oldEnvVars <- base::Sys.getenv() [15:31:49.816] } [15:31:49.816] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:49.816] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:49.816] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:49.816] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:49.816] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:49.816] future.stdout.windows.reencode = NULL, width = 80L) [15:31:49.816] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:49.816] base::names(...future.oldOptions)) [15:31:49.816] } [15:31:49.816] if (FALSE) { [15:31:49.816] } [15:31:49.816] else { [15:31:49.816] if (TRUE) { [15:31:49.816] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:49.816] open = "w") [15:31:49.816] } [15:31:49.816] else { [15:31:49.816] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:49.816] windows = "NUL", "/dev/null"), open = "w") [15:31:49.816] } [15:31:49.816] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:49.816] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:49.816] base::sink(type = "output", split = FALSE) [15:31:49.816] base::close(...future.stdout) [15:31:49.816] }, add = TRUE) [15:31:49.816] } [15:31:49.816] ...future.frame <- base::sys.nframe() [15:31:49.816] ...future.conditions <- base::list() [15:31:49.816] ...future.rng <- base::globalenv()$.Random.seed [15:31:49.816] if (FALSE) { [15:31:49.816] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:49.816] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:49.816] } [15:31:49.816] ...future.result <- base::tryCatch({ [15:31:49.816] base::withCallingHandlers({ [15:31:49.816] ...future.value <- base::withVisible(base::local({ [15:31:49.816] do.call(function(...) { [15:31:49.816] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.816] if (!identical(...future.globals.maxSize.org, [15:31:49.816] ...future.globals.maxSize)) { [15:31:49.816] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.816] on.exit(options(oopts), add = TRUE) [15:31:49.816] } [15:31:49.816] { [15:31:49.816] lapply(seq_along(...future.elements_ii), [15:31:49.816] FUN = function(jj) { [15:31:49.816] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.816] ...future.FUN(...future.X_jj, ...) [15:31:49.816] }) [15:31:49.816] } [15:31:49.816] }, args = future.call.arguments) [15:31:49.816] })) [15:31:49.816] future::FutureResult(value = ...future.value$value, [15:31:49.816] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:49.816] ...future.rng), globalenv = if (FALSE) [15:31:49.816] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:49.816] ...future.globalenv.names)) [15:31:49.816] else NULL, started = ...future.startTime, version = "1.8") [15:31:49.816] }, condition = base::local({ [15:31:49.816] c <- base::c [15:31:49.816] inherits <- base::inherits [15:31:49.816] invokeRestart <- base::invokeRestart [15:31:49.816] length <- base::length [15:31:49.816] list <- base::list [15:31:49.816] seq.int <- base::seq.int [15:31:49.816] signalCondition <- base::signalCondition [15:31:49.816] sys.calls <- base::sys.calls [15:31:49.816] `[[` <- base::`[[` [15:31:49.816] `+` <- base::`+` [15:31:49.816] `<<-` <- base::`<<-` [15:31:49.816] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:49.816] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:49.816] 3L)] [15:31:49.816] } [15:31:49.816] function(cond) { [15:31:49.816] is_error <- inherits(cond, "error") [15:31:49.816] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:49.816] NULL) [15:31:49.816] if (is_error) { [15:31:49.816] sessionInformation <- function() { [15:31:49.816] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:49.816] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:49.816] search = base::search(), system = base::Sys.info()) [15:31:49.816] } [15:31:49.816] ...future.conditions[[length(...future.conditions) + [15:31:49.816] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:49.816] cond$call), session = sessionInformation(), [15:31:49.816] timestamp = base::Sys.time(), signaled = 0L) [15:31:49.816] signalCondition(cond) [15:31:49.816] } [15:31:49.816] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:49.816] "immediateCondition"))) { [15:31:49.816] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:49.816] ...future.conditions[[length(...future.conditions) + [15:31:49.816] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:49.816] if (TRUE && !signal) { [15:31:49.816] muffleCondition <- function (cond, pattern = "^muffle") [15:31:49.816] { [15:31:49.816] inherits <- base::inherits [15:31:49.816] invokeRestart <- base::invokeRestart [15:31:49.816] is.null <- base::is.null [15:31:49.816] muffled <- FALSE [15:31:49.816] if (inherits(cond, "message")) { [15:31:49.816] muffled <- grepl(pattern, "muffleMessage") [15:31:49.816] if (muffled) [15:31:49.816] invokeRestart("muffleMessage") [15:31:49.816] } [15:31:49.816] else if (inherits(cond, "warning")) { [15:31:49.816] muffled <- grepl(pattern, "muffleWarning") [15:31:49.816] if (muffled) [15:31:49.816] invokeRestart("muffleWarning") [15:31:49.816] } [15:31:49.816] else if (inherits(cond, "condition")) { [15:31:49.816] if (!is.null(pattern)) { [15:31:49.816] computeRestarts <- base::computeRestarts [15:31:49.816] grepl <- base::grepl [15:31:49.816] restarts <- computeRestarts(cond) [15:31:49.816] for (restart in restarts) { [15:31:49.816] name <- restart$name [15:31:49.816] if (is.null(name)) [15:31:49.816] next [15:31:49.816] if (!grepl(pattern, name)) [15:31:49.816] next [15:31:49.816] invokeRestart(restart) [15:31:49.816] muffled <- TRUE [15:31:49.816] break [15:31:49.816] } [15:31:49.816] } [15:31:49.816] } [15:31:49.816] invisible(muffled) [15:31:49.816] } [15:31:49.816] muffleCondition(cond, pattern = "^muffle") [15:31:49.816] } [15:31:49.816] } [15:31:49.816] else { [15:31:49.816] if (TRUE) { [15:31:49.816] muffleCondition <- function (cond, pattern = "^muffle") [15:31:49.816] { [15:31:49.816] inherits <- base::inherits [15:31:49.816] invokeRestart <- base::invokeRestart [15:31:49.816] is.null <- base::is.null [15:31:49.816] muffled <- FALSE [15:31:49.816] if (inherits(cond, "message")) { [15:31:49.816] muffled <- grepl(pattern, "muffleMessage") [15:31:49.816] if (muffled) [15:31:49.816] invokeRestart("muffleMessage") [15:31:49.816] } [15:31:49.816] else if (inherits(cond, "warning")) { [15:31:49.816] muffled <- grepl(pattern, "muffleWarning") [15:31:49.816] if (muffled) [15:31:49.816] invokeRestart("muffleWarning") [15:31:49.816] } [15:31:49.816] else if (inherits(cond, "condition")) { [15:31:49.816] if (!is.null(pattern)) { [15:31:49.816] computeRestarts <- base::computeRestarts [15:31:49.816] grepl <- base::grepl [15:31:49.816] restarts <- computeRestarts(cond) [15:31:49.816] for (restart in restarts) { [15:31:49.816] name <- restart$name [15:31:49.816] if (is.null(name)) [15:31:49.816] next [15:31:49.816] if (!grepl(pattern, name)) [15:31:49.816] next [15:31:49.816] invokeRestart(restart) [15:31:49.816] muffled <- TRUE [15:31:49.816] break [15:31:49.816] } [15:31:49.816] } [15:31:49.816] } [15:31:49.816] invisible(muffled) [15:31:49.816] } [15:31:49.816] muffleCondition(cond, pattern = "^muffle") [15:31:49.816] } [15:31:49.816] } [15:31:49.816] } [15:31:49.816] })) [15:31:49.816] }, error = function(ex) { [15:31:49.816] base::structure(base::list(value = NULL, visible = NULL, [15:31:49.816] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:49.816] ...future.rng), started = ...future.startTime, [15:31:49.816] finished = Sys.time(), session_uuid = NA_character_, [15:31:49.816] version = "1.8"), class = "FutureResult") [15:31:49.816] }, finally = { [15:31:49.816] if (!identical(...future.workdir, getwd())) [15:31:49.816] setwd(...future.workdir) [15:31:49.816] { [15:31:49.816] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:49.816] ...future.oldOptions$nwarnings <- NULL [15:31:49.816] } [15:31:49.816] base::options(...future.oldOptions) [15:31:49.816] if (.Platform$OS.type == "windows") { [15:31:49.816] old_names <- names(...future.oldEnvVars) [15:31:49.816] envs <- base::Sys.getenv() [15:31:49.816] names <- names(envs) [15:31:49.816] common <- intersect(names, old_names) [15:31:49.816] added <- setdiff(names, old_names) [15:31:49.816] removed <- setdiff(old_names, names) [15:31:49.816] changed <- common[...future.oldEnvVars[common] != [15:31:49.816] envs[common]] [15:31:49.816] NAMES <- toupper(changed) [15:31:49.816] args <- list() [15:31:49.816] for (kk in seq_along(NAMES)) { [15:31:49.816] name <- changed[[kk]] [15:31:49.816] NAME <- NAMES[[kk]] [15:31:49.816] if (name != NAME && is.element(NAME, old_names)) [15:31:49.816] next [15:31:49.816] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:49.816] } [15:31:49.816] NAMES <- toupper(added) [15:31:49.816] for (kk in seq_along(NAMES)) { [15:31:49.816] name <- added[[kk]] [15:31:49.816] NAME <- NAMES[[kk]] [15:31:49.816] if (name != NAME && is.element(NAME, old_names)) [15:31:49.816] next [15:31:49.816] args[[name]] <- "" [15:31:49.816] } [15:31:49.816] NAMES <- toupper(removed) [15:31:49.816] for (kk in seq_along(NAMES)) { [15:31:49.816] name <- removed[[kk]] [15:31:49.816] NAME <- NAMES[[kk]] [15:31:49.816] if (name != NAME && is.element(NAME, old_names)) [15:31:49.816] next [15:31:49.816] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:49.816] } [15:31:49.816] if (length(args) > 0) [15:31:49.816] base::do.call(base::Sys.setenv, args = args) [15:31:49.816] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:49.816] } [15:31:49.816] else { [15:31:49.816] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:49.816] } [15:31:49.816] { [15:31:49.816] if (base::length(...future.futureOptionsAdded) > [15:31:49.816] 0L) { [15:31:49.816] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:49.816] base::names(opts) <- ...future.futureOptionsAdded [15:31:49.816] base::options(opts) [15:31:49.816] } [15:31:49.816] { [15:31:49.816] { [15:31:49.816] NULL [15:31:49.816] RNGkind("Mersenne-Twister") [15:31:49.816] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:49.816] inherits = FALSE) [15:31:49.816] } [15:31:49.816] options(future.plan = NULL) [15:31:49.816] if (is.na(NA_character_)) [15:31:49.816] Sys.unsetenv("R_FUTURE_PLAN") [15:31:49.816] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:49.816] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:49.816] .init = FALSE) [15:31:49.816] } [15:31:49.816] } [15:31:49.816] } [15:31:49.816] }) [15:31:49.816] if (TRUE) { [15:31:49.816] base::sink(type = "output", split = FALSE) [15:31:49.816] if (TRUE) { [15:31:49.816] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:49.816] } [15:31:49.816] else { [15:31:49.816] ...future.result["stdout"] <- base::list(NULL) [15:31:49.816] } [15:31:49.816] base::close(...future.stdout) [15:31:49.816] ...future.stdout <- NULL [15:31:49.816] } [15:31:49.816] ...future.result$conditions <- ...future.conditions [15:31:49.816] ...future.result$finished <- base::Sys.time() [15:31:49.816] ...future.result [15:31:49.816] } [15:31:49.824] assign_globals() ... [15:31:49.824] List of 5 [15:31:49.824] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:49.824] $ future.call.arguments :List of 1 [15:31:49.824] ..$ length: int 2 [15:31:49.824] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.824] $ ...future.elements_ii :List of 4 [15:31:49.824] ..$ b: chr "numeric" [15:31:49.824] ..$ c: chr "character" [15:31:49.824] ..$ a: chr "integer" [15:31:49.824] ..$ c: chr "list" [15:31:49.824] $ ...future.seeds_ii : NULL [15:31:49.824] $ ...future.globals.maxSize: NULL [15:31:49.824] - attr(*, "where")=List of 5 [15:31:49.824] ..$ ...future.FUN : [15:31:49.824] ..$ future.call.arguments : [15:31:49.824] ..$ ...future.elements_ii : [15:31:49.824] ..$ ...future.seeds_ii : [15:31:49.824] ..$ ...future.globals.maxSize: [15:31:49.824] - attr(*, "resolved")= logi FALSE [15:31:49.824] - attr(*, "total_size")= num 2240 [15:31:49.824] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.824] - attr(*, "already-done")= logi TRUE [15:31:49.837] - copied '...future.FUN' to environment [15:31:49.838] - copied 'future.call.arguments' to environment [15:31:49.838] - copied '...future.elements_ii' to environment [15:31:49.838] - copied '...future.seeds_ii' to environment [15:31:49.838] - copied '...future.globals.maxSize' to environment [15:31:49.839] assign_globals() ... done [15:31:49.840] plan(): Setting new future strategy stack: [15:31:49.840] List of future strategies: [15:31:49.840] 1. sequential: [15:31:49.840] - args: function (..., envir = parent.frame(), workers = "") [15:31:49.840] - tweaked: FALSE [15:31:49.840] - call: NULL [15:31:49.841] plan(): nbrOfWorkers() = 1 [15:31:49.843] plan(): Setting new future strategy stack: [15:31:49.844] List of future strategies: [15:31:49.844] 1. multisession: [15:31:49.844] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:49.844] - tweaked: FALSE [15:31:49.844] - call: plan(strategy) [15:31:49.848] plan(): nbrOfWorkers() = 1 [15:31:49.849] SequentialFuture started (and completed) [15:31:49.849] - Launch lazy future ... done [15:31:49.850] run() for 'SequentialFuture' ... done [15:31:49.850] Created future: [15:31:49.850] SequentialFuture: [15:31:49.850] Label: 'future_lapply-1' [15:31:49.850] Expression: [15:31:49.850] { [15:31:49.850] do.call(function(...) { [15:31:49.850] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.850] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:49.850] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.850] on.exit(options(oopts), add = TRUE) [15:31:49.850] } [15:31:49.850] { [15:31:49.850] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:49.850] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.850] ...future.FUN(...future.X_jj, ...) [15:31:49.850] }) [15:31:49.850] } [15:31:49.850] }, args = future.call.arguments) [15:31:49.850] } [15:31:49.850] Lazy evaluation: FALSE [15:31:49.850] Asynchronous evaluation: FALSE [15:31:49.850] Local evaluation: TRUE [15:31:49.850] Environment: R_GlobalEnv [15:31:49.850] Capture standard output: TRUE [15:31:49.850] Capture condition classes: 'condition' (excluding 'nothing') [15:31:49.850] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:49.850] Packages: [15:31:49.850] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:49.850] Resolved: TRUE [15:31:49.850] Value: 240 bytes of class 'list' [15:31:49.850] Early signaling: FALSE [15:31:49.850] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:49.850] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:49.853] Chunk #1 of 1 ... DONE [15:31:49.853] Launching 1 futures (chunks) ... DONE [15:31:49.854] Resolving 1 futures (chunks) ... [15:31:49.854] resolve() on list ... [15:31:49.854] recursive: 0 [15:31:49.855] length: 1 [15:31:49.855] [15:31:49.855] resolved() for 'SequentialFuture' ... [15:31:49.856] - state: 'finished' [15:31:49.856] - run: TRUE [15:31:49.856] - result: 'FutureResult' [15:31:49.857] resolved() for 'SequentialFuture' ... done [15:31:49.857] Future #1 [15:31:49.857] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:49.858] - nx: 1 [15:31:49.858] - relay: TRUE [15:31:49.858] - stdout: TRUE [15:31:49.858] - signal: TRUE [15:31:49.859] - resignal: FALSE [15:31:49.859] - force: TRUE [15:31:49.859] - relayed: [n=1] FALSE [15:31:49.859] - queued futures: [n=1] FALSE [15:31:49.860] - until=1 [15:31:49.860] - relaying element #1 [15:31:49.861] - relayed: [n=1] TRUE [15:31:49.861] - queued futures: [n=1] TRUE [15:31:49.861] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:49.862] length: 0 (resolved future 1) [15:31:49.862] Relaying remaining futures [15:31:49.862] signalConditionsASAP(NULL, pos=0) ... [15:31:49.862] - nx: 1 [15:31:49.863] - relay: TRUE [15:31:49.863] - stdout: TRUE [15:31:49.863] - signal: TRUE [15:31:49.864] - resignal: FALSE [15:31:49.864] - force: TRUE [15:31:49.864] - relayed: [n=1] TRUE [15:31:49.865] - queued futures: [n=1] TRUE - flush all [15:31:49.865] - relayed: [n=1] TRUE [15:31:49.865] - queued futures: [n=1] TRUE [15:31:49.866] signalConditionsASAP(NULL, pos=0) ... done [15:31:49.866] resolve() on list ... DONE [15:31:49.867] - Number of value chunks collected: 1 [15:31:49.867] Resolving 1 futures (chunks) ... DONE [15:31:49.867] Reducing values from 1 chunks ... [15:31:49.867] - Number of values collected after concatenation: 4 [15:31:49.868] - Number of values expected: 4 [15:31:49.868] Reverse index remapping (attribute 'ordering'): [n = 4] 3, 1, 2, 4 [15:31:49.868] Reducing values from 1 chunks ... DONE [15:31:49.869] 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 [15:31:49.874] future_lapply() ... [15:31:49.880] Number of chunks: 1 [15:31:49.881] Index remapping (attribute 'ordering'): [n = 4] 3, 2, 1, 4 [15:31:49.881] getGlobalsAndPackagesXApply() ... [15:31:49.881] - future.globals: TRUE [15:31:49.882] getGlobalsAndPackages() ... [15:31:49.882] Searching for globals... [15:31:49.885] - globals found: [2] 'FUN', '.Internal' [15:31:49.886] Searching for globals ... DONE [15:31:49.886] Resolving globals: FALSE [15:31:49.887] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:49.888] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:49.888] - globals: [1] 'FUN' [15:31:49.889] [15:31:49.889] getGlobalsAndPackages() ... DONE [15:31:49.889] - globals found/used: [n=1] 'FUN' [15:31:49.889] - needed namespaces: [n=0] [15:31:49.890] Finding globals ... DONE [15:31:49.890] - use_args: TRUE [15:31:49.890] - Getting '...' globals ... [15:31:49.891] resolve() on list ... [15:31:49.892] recursive: 0 [15:31:49.892] length: 1 [15:31:49.892] elements: '...' [15:31:49.893] length: 0 (resolved future 1) [15:31:49.893] resolve() on list ... DONE [15:31:49.893] - '...' content: [n=1] 'length' [15:31:49.894] List of 1 [15:31:49.894] $ ...:List of 1 [15:31:49.894] ..$ length: int 2 [15:31:49.894] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.894] - attr(*, "where")=List of 1 [15:31:49.894] ..$ ...: [15:31:49.894] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.894] - attr(*, "resolved")= logi TRUE [15:31:49.894] - attr(*, "total_size")= num NA [15:31:49.901] - Getting '...' globals ... DONE [15:31:49.901] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:49.902] List of 2 [15:31:49.902] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:49.902] $ ... :List of 1 [15:31:49.902] ..$ length: int 2 [15:31:49.902] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.902] - attr(*, "where")=List of 2 [15:31:49.902] ..$ ...future.FUN: [15:31:49.902] ..$ ... : [15:31:49.902] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.902] - attr(*, "resolved")= logi FALSE [15:31:49.902] - attr(*, "total_size")= num 2240 [15:31:49.909] Packages to be attached in all futures: [n=0] [15:31:49.909] getGlobalsAndPackagesXApply() ... DONE [15:31:49.910] Number of futures (= number of chunks): 1 [15:31:49.910] Launching 1 futures (chunks) ... [15:31:49.911] Chunk #1 of 1 ... [15:31:49.911] - Finding globals in 'X' for chunk #1 ... [15:31:49.911] getGlobalsAndPackages() ... [15:31:49.911] Searching for globals... [15:31:49.912] [15:31:49.912] Searching for globals ... DONE [15:31:49.912] - globals: [0] [15:31:49.913] getGlobalsAndPackages() ... DONE [15:31:49.913] + additional globals found: [n=0] [15:31:49.913] + additional namespaces needed: [n=0] [15:31:49.913] - Finding globals in 'X' for chunk #1 ... DONE [15:31:49.913] - seeds: [15:31:49.914] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.914] getGlobalsAndPackages() ... [15:31:49.914] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.914] Resolving globals: FALSE [15:31:49.915] Tweak future expression to call with '...' arguments ... [15:31:49.915] { [15:31:49.915] do.call(function(...) { [15:31:49.915] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.915] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:49.915] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.915] on.exit(options(oopts), add = TRUE) [15:31:49.915] } [15:31:49.915] { [15:31:49.915] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:49.915] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.915] ...future.FUN(...future.X_jj, ...) [15:31:49.915] }) [15:31:49.915] } [15:31:49.915] }, args = future.call.arguments) [15:31:49.915] } [15:31:49.915] Tweak future expression to call with '...' arguments ... DONE [15:31:49.916] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:49.917] [15:31:49.917] getGlobalsAndPackages() ... DONE [15:31:49.918] run() for 'Future' ... [15:31:49.918] - state: 'created' [15:31:49.919] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:49.922] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:49.922] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:49.922] - Field: 'label' [15:31:49.923] - Field: 'local' [15:31:49.923] - Field: 'owner' [15:31:49.923] - Field: 'envir' [15:31:49.923] - Field: 'packages' [15:31:49.923] - Field: 'gc' [15:31:49.924] - Field: 'conditions' [15:31:49.924] - Field: 'expr' [15:31:49.924] - Field: 'uuid' [15:31:49.924] - Field: 'seed' [15:31:49.924] - Field: 'version' [15:31:49.924] - Field: 'result' [15:31:49.925] - Field: 'asynchronous' [15:31:49.925] - Field: 'calls' [15:31:49.925] - Field: 'globals' [15:31:49.925] - Field: 'stdout' [15:31:49.925] - Field: 'earlySignal' [15:31:49.926] - Field: 'lazy' [15:31:49.926] - Field: 'state' [15:31:49.926] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:49.926] - Launch lazy future ... [15:31:49.927] Packages needed by the future expression (n = 0): [15:31:49.927] Packages needed by future strategies (n = 0): [15:31:49.928] { [15:31:49.928] { [15:31:49.928] { [15:31:49.928] ...future.startTime <- base::Sys.time() [15:31:49.928] { [15:31:49.928] { [15:31:49.928] { [15:31:49.928] base::local({ [15:31:49.928] has_future <- base::requireNamespace("future", [15:31:49.928] quietly = TRUE) [15:31:49.928] if (has_future) { [15:31:49.928] ns <- base::getNamespace("future") [15:31:49.928] version <- ns[[".package"]][["version"]] [15:31:49.928] if (is.null(version)) [15:31:49.928] version <- utils::packageVersion("future") [15:31:49.928] } [15:31:49.928] else { [15:31:49.928] version <- NULL [15:31:49.928] } [15:31:49.928] if (!has_future || version < "1.8.0") { [15:31:49.928] info <- base::c(r_version = base::gsub("R version ", [15:31:49.928] "", base::R.version$version.string), [15:31:49.928] platform = base::sprintf("%s (%s-bit)", [15:31:49.928] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:49.928] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:49.928] "release", "version")], collapse = " "), [15:31:49.928] hostname = base::Sys.info()[["nodename"]]) [15:31:49.928] info <- base::sprintf("%s: %s", base::names(info), [15:31:49.928] info) [15:31:49.928] info <- base::paste(info, collapse = "; ") [15:31:49.928] if (!has_future) { [15:31:49.928] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:49.928] info) [15:31:49.928] } [15:31:49.928] else { [15:31:49.928] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:49.928] info, version) [15:31:49.928] } [15:31:49.928] base::stop(msg) [15:31:49.928] } [15:31:49.928] }) [15:31:49.928] } [15:31:49.928] ...future.strategy.old <- future::plan("list") [15:31:49.928] options(future.plan = NULL) [15:31:49.928] Sys.unsetenv("R_FUTURE_PLAN") [15:31:49.928] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:49.928] } [15:31:49.928] ...future.workdir <- getwd() [15:31:49.928] } [15:31:49.928] ...future.oldOptions <- base::as.list(base::.Options) [15:31:49.928] ...future.oldEnvVars <- base::Sys.getenv() [15:31:49.928] } [15:31:49.928] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:49.928] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:49.928] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:49.928] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:49.928] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:49.928] future.stdout.windows.reencode = NULL, width = 80L) [15:31:49.928] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:49.928] base::names(...future.oldOptions)) [15:31:49.928] } [15:31:49.928] if (FALSE) { [15:31:49.928] } [15:31:49.928] else { [15:31:49.928] if (TRUE) { [15:31:49.928] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:49.928] open = "w") [15:31:49.928] } [15:31:49.928] else { [15:31:49.928] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:49.928] windows = "NUL", "/dev/null"), open = "w") [15:31:49.928] } [15:31:49.928] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:49.928] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:49.928] base::sink(type = "output", split = FALSE) [15:31:49.928] base::close(...future.stdout) [15:31:49.928] }, add = TRUE) [15:31:49.928] } [15:31:49.928] ...future.frame <- base::sys.nframe() [15:31:49.928] ...future.conditions <- base::list() [15:31:49.928] ...future.rng <- base::globalenv()$.Random.seed [15:31:49.928] if (FALSE) { [15:31:49.928] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:49.928] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:49.928] } [15:31:49.928] ...future.result <- base::tryCatch({ [15:31:49.928] base::withCallingHandlers({ [15:31:49.928] ...future.value <- base::withVisible(base::local({ [15:31:49.928] do.call(function(...) { [15:31:49.928] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.928] if (!identical(...future.globals.maxSize.org, [15:31:49.928] ...future.globals.maxSize)) { [15:31:49.928] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.928] on.exit(options(oopts), add = TRUE) [15:31:49.928] } [15:31:49.928] { [15:31:49.928] lapply(seq_along(...future.elements_ii), [15:31:49.928] FUN = function(jj) { [15:31:49.928] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.928] ...future.FUN(...future.X_jj, ...) [15:31:49.928] }) [15:31:49.928] } [15:31:49.928] }, args = future.call.arguments) [15:31:49.928] })) [15:31:49.928] future::FutureResult(value = ...future.value$value, [15:31:49.928] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:49.928] ...future.rng), globalenv = if (FALSE) [15:31:49.928] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:49.928] ...future.globalenv.names)) [15:31:49.928] else NULL, started = ...future.startTime, version = "1.8") [15:31:49.928] }, condition = base::local({ [15:31:49.928] c <- base::c [15:31:49.928] inherits <- base::inherits [15:31:49.928] invokeRestart <- base::invokeRestart [15:31:49.928] length <- base::length [15:31:49.928] list <- base::list [15:31:49.928] seq.int <- base::seq.int [15:31:49.928] signalCondition <- base::signalCondition [15:31:49.928] sys.calls <- base::sys.calls [15:31:49.928] `[[` <- base::`[[` [15:31:49.928] `+` <- base::`+` [15:31:49.928] `<<-` <- base::`<<-` [15:31:49.928] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:49.928] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:49.928] 3L)] [15:31:49.928] } [15:31:49.928] function(cond) { [15:31:49.928] is_error <- inherits(cond, "error") [15:31:49.928] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:49.928] NULL) [15:31:49.928] if (is_error) { [15:31:49.928] sessionInformation <- function() { [15:31:49.928] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:49.928] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:49.928] search = base::search(), system = base::Sys.info()) [15:31:49.928] } [15:31:49.928] ...future.conditions[[length(...future.conditions) + [15:31:49.928] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:49.928] cond$call), session = sessionInformation(), [15:31:49.928] timestamp = base::Sys.time(), signaled = 0L) [15:31:49.928] signalCondition(cond) [15:31:49.928] } [15:31:49.928] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:49.928] "immediateCondition"))) { [15:31:49.928] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:49.928] ...future.conditions[[length(...future.conditions) + [15:31:49.928] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:49.928] if (TRUE && !signal) { [15:31:49.928] muffleCondition <- function (cond, pattern = "^muffle") [15:31:49.928] { [15:31:49.928] inherits <- base::inherits [15:31:49.928] invokeRestart <- base::invokeRestart [15:31:49.928] is.null <- base::is.null [15:31:49.928] muffled <- FALSE [15:31:49.928] if (inherits(cond, "message")) { [15:31:49.928] muffled <- grepl(pattern, "muffleMessage") [15:31:49.928] if (muffled) [15:31:49.928] invokeRestart("muffleMessage") [15:31:49.928] } [15:31:49.928] else if (inherits(cond, "warning")) { [15:31:49.928] muffled <- grepl(pattern, "muffleWarning") [15:31:49.928] if (muffled) [15:31:49.928] invokeRestart("muffleWarning") [15:31:49.928] } [15:31:49.928] else if (inherits(cond, "condition")) { [15:31:49.928] if (!is.null(pattern)) { [15:31:49.928] computeRestarts <- base::computeRestarts [15:31:49.928] grepl <- base::grepl [15:31:49.928] restarts <- computeRestarts(cond) [15:31:49.928] for (restart in restarts) { [15:31:49.928] name <- restart$name [15:31:49.928] if (is.null(name)) [15:31:49.928] next [15:31:49.928] if (!grepl(pattern, name)) [15:31:49.928] next [15:31:49.928] invokeRestart(restart) [15:31:49.928] muffled <- TRUE [15:31:49.928] break [15:31:49.928] } [15:31:49.928] } [15:31:49.928] } [15:31:49.928] invisible(muffled) [15:31:49.928] } [15:31:49.928] muffleCondition(cond, pattern = "^muffle") [15:31:49.928] } [15:31:49.928] } [15:31:49.928] else { [15:31:49.928] if (TRUE) { [15:31:49.928] muffleCondition <- function (cond, pattern = "^muffle") [15:31:49.928] { [15:31:49.928] inherits <- base::inherits [15:31:49.928] invokeRestart <- base::invokeRestart [15:31:49.928] is.null <- base::is.null [15:31:49.928] muffled <- FALSE [15:31:49.928] if (inherits(cond, "message")) { [15:31:49.928] muffled <- grepl(pattern, "muffleMessage") [15:31:49.928] if (muffled) [15:31:49.928] invokeRestart("muffleMessage") [15:31:49.928] } [15:31:49.928] else if (inherits(cond, "warning")) { [15:31:49.928] muffled <- grepl(pattern, "muffleWarning") [15:31:49.928] if (muffled) [15:31:49.928] invokeRestart("muffleWarning") [15:31:49.928] } [15:31:49.928] else if (inherits(cond, "condition")) { [15:31:49.928] if (!is.null(pattern)) { [15:31:49.928] computeRestarts <- base::computeRestarts [15:31:49.928] grepl <- base::grepl [15:31:49.928] restarts <- computeRestarts(cond) [15:31:49.928] for (restart in restarts) { [15:31:49.928] name <- restart$name [15:31:49.928] if (is.null(name)) [15:31:49.928] next [15:31:49.928] if (!grepl(pattern, name)) [15:31:49.928] next [15:31:49.928] invokeRestart(restart) [15:31:49.928] muffled <- TRUE [15:31:49.928] break [15:31:49.928] } [15:31:49.928] } [15:31:49.928] } [15:31:49.928] invisible(muffled) [15:31:49.928] } [15:31:49.928] muffleCondition(cond, pattern = "^muffle") [15:31:49.928] } [15:31:49.928] } [15:31:49.928] } [15:31:49.928] })) [15:31:49.928] }, error = function(ex) { [15:31:49.928] base::structure(base::list(value = NULL, visible = NULL, [15:31:49.928] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:49.928] ...future.rng), started = ...future.startTime, [15:31:49.928] finished = Sys.time(), session_uuid = NA_character_, [15:31:49.928] version = "1.8"), class = "FutureResult") [15:31:49.928] }, finally = { [15:31:49.928] if (!identical(...future.workdir, getwd())) [15:31:49.928] setwd(...future.workdir) [15:31:49.928] { [15:31:49.928] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:49.928] ...future.oldOptions$nwarnings <- NULL [15:31:49.928] } [15:31:49.928] base::options(...future.oldOptions) [15:31:49.928] if (.Platform$OS.type == "windows") { [15:31:49.928] old_names <- names(...future.oldEnvVars) [15:31:49.928] envs <- base::Sys.getenv() [15:31:49.928] names <- names(envs) [15:31:49.928] common <- intersect(names, old_names) [15:31:49.928] added <- setdiff(names, old_names) [15:31:49.928] removed <- setdiff(old_names, names) [15:31:49.928] changed <- common[...future.oldEnvVars[common] != [15:31:49.928] envs[common]] [15:31:49.928] NAMES <- toupper(changed) [15:31:49.928] args <- list() [15:31:49.928] for (kk in seq_along(NAMES)) { [15:31:49.928] name <- changed[[kk]] [15:31:49.928] NAME <- NAMES[[kk]] [15:31:49.928] if (name != NAME && is.element(NAME, old_names)) [15:31:49.928] next [15:31:49.928] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:49.928] } [15:31:49.928] NAMES <- toupper(added) [15:31:49.928] for (kk in seq_along(NAMES)) { [15:31:49.928] name <- added[[kk]] [15:31:49.928] NAME <- NAMES[[kk]] [15:31:49.928] if (name != NAME && is.element(NAME, old_names)) [15:31:49.928] next [15:31:49.928] args[[name]] <- "" [15:31:49.928] } [15:31:49.928] NAMES <- toupper(removed) [15:31:49.928] for (kk in seq_along(NAMES)) { [15:31:49.928] name <- removed[[kk]] [15:31:49.928] NAME <- NAMES[[kk]] [15:31:49.928] if (name != NAME && is.element(NAME, old_names)) [15:31:49.928] next [15:31:49.928] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:49.928] } [15:31:49.928] if (length(args) > 0) [15:31:49.928] base::do.call(base::Sys.setenv, args = args) [15:31:49.928] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:49.928] } [15:31:49.928] else { [15:31:49.928] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:49.928] } [15:31:49.928] { [15:31:49.928] if (base::length(...future.futureOptionsAdded) > [15:31:49.928] 0L) { [15:31:49.928] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:49.928] base::names(opts) <- ...future.futureOptionsAdded [15:31:49.928] base::options(opts) [15:31:49.928] } [15:31:49.928] { [15:31:49.928] { [15:31:49.928] NULL [15:31:49.928] RNGkind("Mersenne-Twister") [15:31:49.928] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:49.928] inherits = FALSE) [15:31:49.928] } [15:31:49.928] options(future.plan = NULL) [15:31:49.928] if (is.na(NA_character_)) [15:31:49.928] Sys.unsetenv("R_FUTURE_PLAN") [15:31:49.928] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:49.928] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:49.928] .init = FALSE) [15:31:49.928] } [15:31:49.928] } [15:31:49.928] } [15:31:49.928] }) [15:31:49.928] if (TRUE) { [15:31:49.928] base::sink(type = "output", split = FALSE) [15:31:49.928] if (TRUE) { [15:31:49.928] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:49.928] } [15:31:49.928] else { [15:31:49.928] ...future.result["stdout"] <- base::list(NULL) [15:31:49.928] } [15:31:49.928] base::close(...future.stdout) [15:31:49.928] ...future.stdout <- NULL [15:31:49.928] } [15:31:49.928] ...future.result$conditions <- ...future.conditions [15:31:49.928] ...future.result$finished <- base::Sys.time() [15:31:49.928] ...future.result [15:31:49.928] } [15:31:49.932] assign_globals() ... [15:31:49.932] List of 5 [15:31:49.932] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:49.932] $ future.call.arguments :List of 1 [15:31:49.932] ..$ length: int 2 [15:31:49.932] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.932] $ ...future.elements_ii :List of 4 [15:31:49.932] ..$ c: chr "character" [15:31:49.932] ..$ b: chr "numeric" [15:31:49.932] ..$ a: chr "integer" [15:31:49.932] ..$ c: chr "list" [15:31:49.932] $ ...future.seeds_ii : NULL [15:31:49.932] $ ...future.globals.maxSize: NULL [15:31:49.932] - attr(*, "where")=List of 5 [15:31:49.932] ..$ ...future.FUN : [15:31:49.932] ..$ future.call.arguments : [15:31:49.932] ..$ ...future.elements_ii : [15:31:49.932] ..$ ...future.seeds_ii : [15:31:49.932] ..$ ...future.globals.maxSize: [15:31:49.932] - attr(*, "resolved")= logi FALSE [15:31:49.932] - attr(*, "total_size")= num 2240 [15:31:49.932] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.932] - attr(*, "already-done")= logi TRUE [15:31:49.945] - copied '...future.FUN' to environment [15:31:49.945] - copied 'future.call.arguments' to environment [15:31:49.945] - copied '...future.elements_ii' to environment [15:31:49.945] - copied '...future.seeds_ii' to environment [15:31:49.945] - copied '...future.globals.maxSize' to environment [15:31:49.946] assign_globals() ... done [15:31:49.946] plan(): Setting new future strategy stack: [15:31:49.946] List of future strategies: [15:31:49.946] 1. sequential: [15:31:49.946] - args: function (..., envir = parent.frame(), workers = "") [15:31:49.946] - tweaked: FALSE [15:31:49.946] - call: NULL [15:31:49.947] plan(): nbrOfWorkers() = 1 [15:31:49.949] plan(): Setting new future strategy stack: [15:31:49.949] List of future strategies: [15:31:49.949] 1. multisession: [15:31:49.949] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:49.949] - tweaked: FALSE [15:31:49.949] - call: plan(strategy) [15:31:49.952] plan(): nbrOfWorkers() = 1 [15:31:49.952] SequentialFuture started (and completed) [15:31:49.953] - Launch lazy future ... done [15:31:49.953] run() for 'SequentialFuture' ... done [15:31:49.953] Created future: [15:31:49.953] SequentialFuture: [15:31:49.953] Label: 'future_lapply-1' [15:31:49.953] Expression: [15:31:49.953] { [15:31:49.953] do.call(function(...) { [15:31:49.953] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:49.953] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:49.953] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:49.953] on.exit(options(oopts), add = TRUE) [15:31:49.953] } [15:31:49.953] { [15:31:49.953] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:49.953] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:49.953] ...future.FUN(...future.X_jj, ...) [15:31:49.953] }) [15:31:49.953] } [15:31:49.953] }, args = future.call.arguments) [15:31:49.953] } [15:31:49.953] Lazy evaluation: FALSE [15:31:49.953] Asynchronous evaluation: FALSE [15:31:49.953] Local evaluation: TRUE [15:31:49.953] Environment: R_GlobalEnv [15:31:49.953] Capture standard output: TRUE [15:31:49.953] Capture condition classes: 'condition' (excluding 'nothing') [15:31:49.953] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:49.953] Packages: [15:31:49.953] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:49.953] Resolved: TRUE [15:31:49.953] Value: 240 bytes of class 'list' [15:31:49.953] Early signaling: FALSE [15:31:49.953] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:49.953] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:49.955] Chunk #1 of 1 ... DONE [15:31:49.955] Launching 1 futures (chunks) ... DONE [15:31:49.955] Resolving 1 futures (chunks) ... [15:31:49.956] resolve() on list ... [15:31:49.956] recursive: 0 [15:31:49.956] length: 1 [15:31:49.956] [15:31:49.956] resolved() for 'SequentialFuture' ... [15:31:49.957] - state: 'finished' [15:31:49.957] - run: TRUE [15:31:49.957] - result: 'FutureResult' [15:31:49.957] resolved() for 'SequentialFuture' ... done [15:31:49.958] Future #1 [15:31:49.958] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:49.958] - nx: 1 [15:31:49.958] - relay: TRUE [15:31:49.959] - stdout: TRUE [15:31:49.959] - signal: TRUE [15:31:49.959] - resignal: FALSE [15:31:49.960] - force: TRUE [15:31:49.960] - relayed: [n=1] FALSE [15:31:49.960] - queued futures: [n=1] FALSE [15:31:49.961] - until=1 [15:31:49.961] - relaying element #1 [15:31:49.961] - relayed: [n=1] TRUE [15:31:49.962] - queued futures: [n=1] TRUE [15:31:49.962] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:49.962] length: 0 (resolved future 1) [15:31:49.963] Relaying remaining futures [15:31:49.963] signalConditionsASAP(NULL, pos=0) ... [15:31:49.963] - nx: 1 [15:31:49.964] - relay: TRUE [15:31:49.964] - stdout: TRUE [15:31:49.964] - signal: TRUE [15:31:49.964] - resignal: FALSE [15:31:49.965] - force: TRUE [15:31:49.965] - relayed: [n=1] TRUE [15:31:49.965] - queued futures: [n=1] TRUE - flush all [15:31:49.966] - relayed: [n=1] TRUE [15:31:49.966] - queued futures: [n=1] TRUE [15:31:49.967] signalConditionsASAP(NULL, pos=0) ... done [15:31:49.967] resolve() on list ... DONE [15:31:49.968] - Number of value chunks collected: 1 [15:31:49.968] Resolving 1 futures (chunks) ... DONE [15:31:49.968] Reducing values from 1 chunks ... [15:31:49.968] - Number of values collected after concatenation: 4 [15:31:49.969] - Number of values expected: 4 [15:31:49.969] Reverse index remapping (attribute 'ordering'): [n = 4] 3, 2, 1, 4 [15:31:49.969] Reducing values from 1 chunks ... DONE [15:31:49.970] 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, ...) ... [15:31:49.974] future_lapply() ... [15:31:49.979] Number of chunks: 1 [15:31:49.979] Index remapping (attribute 'ordering'): [n = 4] 3, 1, 2, 4 [15:31:49.980] getGlobalsAndPackagesXApply() ... [15:31:49.980] - future.globals: TRUE [15:31:49.980] getGlobalsAndPackages() ... [15:31:49.981] Searching for globals... [15:31:49.984] - globals found: [2] 'FUN', '.Internal' [15:31:49.984] Searching for globals ... DONE [15:31:49.984] Resolving globals: FALSE [15:31:49.985] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:49.986] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:49.986] - globals: [1] 'FUN' [15:31:49.987] [15:31:49.987] getGlobalsAndPackages() ... DONE [15:31:49.987] - globals found/used: [n=1] 'FUN' [15:31:49.987] - needed namespaces: [n=0] [15:31:49.988] Finding globals ... DONE [15:31:49.988] - use_args: TRUE [15:31:49.988] - Getting '...' globals ... [15:31:49.989] resolve() on list ... [15:31:49.989] recursive: 0 [15:31:49.990] length: 1 [15:31:49.990] elements: '...' [15:31:49.990] length: 0 (resolved future 1) [15:31:49.990] resolve() on list ... DONE [15:31:49.991] - '...' content: [n=1] 'length' [15:31:49.991] List of 1 [15:31:49.991] $ ...:List of 1 [15:31:49.991] ..$ length: int 2 [15:31:49.991] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.991] - attr(*, "where")=List of 1 [15:31:49.991] ..$ ...: [15:31:49.991] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.991] - attr(*, "resolved")= logi TRUE [15:31:49.991] - attr(*, "total_size")= num NA [15:31:49.997] - Getting '...' globals ... DONE [15:31:49.998] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:49.998] List of 2 [15:31:49.998] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:49.998] $ ... :List of 1 [15:31:49.998] ..$ length: int 2 [15:31:49.998] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:49.998] - attr(*, "where")=List of 2 [15:31:49.998] ..$ ...future.FUN: [15:31:49.998] ..$ ... : [15:31:49.998] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:49.998] - attr(*, "resolved")= logi FALSE [15:31:49.998] - attr(*, "total_size")= num 2240 [15:31:50.005] Packages to be attached in all futures: [n=0] [15:31:50.006] getGlobalsAndPackagesXApply() ... DONE [15:31:50.006] Number of futures (= number of chunks): 1 [15:31:50.007] Launching 1 futures (chunks) ... [15:31:50.007] Chunk #1 of 1 ... [15:31:50.007] - Finding globals in 'X' for chunk #1 ... [15:31:50.008] getGlobalsAndPackages() ... [15:31:50.008] Searching for globals... [15:31:50.009] [15:31:50.009] Searching for globals ... DONE [15:31:50.009] - globals: [0] [15:31:50.009] getGlobalsAndPackages() ... DONE [15:31:50.010] + additional globals found: [n=0] [15:31:50.010] + additional namespaces needed: [n=0] [15:31:50.010] - Finding globals in 'X' for chunk #1 ... DONE [15:31:50.011] - seeds: [15:31:50.011] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.011] getGlobalsAndPackages() ... [15:31:50.012] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.012] Resolving globals: FALSE [15:31:50.012] Tweak future expression to call with '...' arguments ... [15:31:50.013] { [15:31:50.013] do.call(function(...) { [15:31:50.013] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:50.013] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:50.013] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:50.013] on.exit(options(oopts), add = TRUE) [15:31:50.013] } [15:31:50.013] { [15:31:50.013] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:50.013] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:50.013] ...future.FUN(...future.X_jj, ...) [15:31:50.013] }) [15:31:50.013] } [15:31:50.013] }, args = future.call.arguments) [15:31:50.013] } [15:31:50.014] Tweak future expression to call with '...' arguments ... DONE [15:31:50.015] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.015] [15:31:50.015] getGlobalsAndPackages() ... DONE [15:31:50.016] run() for 'Future' ... [15:31:50.017] - state: 'created' [15:31:50.017] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:50.022] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:50.023] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:50.023] - Field: 'label' [15:31:50.024] - Field: 'local' [15:31:50.024] - Field: 'owner' [15:31:50.024] - Field: 'envir' [15:31:50.025] - Field: 'packages' [15:31:50.025] - Field: 'gc' [15:31:50.025] - Field: 'conditions' [15:31:50.026] - Field: 'expr' [15:31:50.026] - Field: 'uuid' [15:31:50.026] - Field: 'seed' [15:31:50.027] - Field: 'version' [15:31:50.027] - Field: 'result' [15:31:50.027] - Field: 'asynchronous' [15:31:50.028] - Field: 'calls' [15:31:50.028] - Field: 'globals' [15:31:50.029] - Field: 'stdout' [15:31:50.029] - Field: 'earlySignal' [15:31:50.029] - Field: 'lazy' [15:31:50.030] - Field: 'state' [15:31:50.030] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:50.030] - Launch lazy future ... [15:31:50.031] Packages needed by the future expression (n = 0): [15:31:50.031] Packages needed by future strategies (n = 0): [15:31:50.032] { [15:31:50.032] { [15:31:50.032] { [15:31:50.032] ...future.startTime <- base::Sys.time() [15:31:50.032] { [15:31:50.032] { [15:31:50.032] { [15:31:50.032] base::local({ [15:31:50.032] has_future <- base::requireNamespace("future", [15:31:50.032] quietly = TRUE) [15:31:50.032] if (has_future) { [15:31:50.032] ns <- base::getNamespace("future") [15:31:50.032] version <- ns[[".package"]][["version"]] [15:31:50.032] if (is.null(version)) [15:31:50.032] version <- utils::packageVersion("future") [15:31:50.032] } [15:31:50.032] else { [15:31:50.032] version <- NULL [15:31:50.032] } [15:31:50.032] if (!has_future || version < "1.8.0") { [15:31:50.032] info <- base::c(r_version = base::gsub("R version ", [15:31:50.032] "", base::R.version$version.string), [15:31:50.032] platform = base::sprintf("%s (%s-bit)", [15:31:50.032] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:50.032] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:50.032] "release", "version")], collapse = " "), [15:31:50.032] hostname = base::Sys.info()[["nodename"]]) [15:31:50.032] info <- base::sprintf("%s: %s", base::names(info), [15:31:50.032] info) [15:31:50.032] info <- base::paste(info, collapse = "; ") [15:31:50.032] if (!has_future) { [15:31:50.032] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:50.032] info) [15:31:50.032] } [15:31:50.032] else { [15:31:50.032] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:50.032] info, version) [15:31:50.032] } [15:31:50.032] base::stop(msg) [15:31:50.032] } [15:31:50.032] }) [15:31:50.032] } [15:31:50.032] ...future.strategy.old <- future::plan("list") [15:31:50.032] options(future.plan = NULL) [15:31:50.032] Sys.unsetenv("R_FUTURE_PLAN") [15:31:50.032] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:50.032] } [15:31:50.032] ...future.workdir <- getwd() [15:31:50.032] } [15:31:50.032] ...future.oldOptions <- base::as.list(base::.Options) [15:31:50.032] ...future.oldEnvVars <- base::Sys.getenv() [15:31:50.032] } [15:31:50.032] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:50.032] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:50.032] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:50.032] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:50.032] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:50.032] future.stdout.windows.reencode = NULL, width = 80L) [15:31:50.032] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:50.032] base::names(...future.oldOptions)) [15:31:50.032] } [15:31:50.032] if (FALSE) { [15:31:50.032] } [15:31:50.032] else { [15:31:50.032] if (TRUE) { [15:31:50.032] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:50.032] open = "w") [15:31:50.032] } [15:31:50.032] else { [15:31:50.032] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:50.032] windows = "NUL", "/dev/null"), open = "w") [15:31:50.032] } [15:31:50.032] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:50.032] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:50.032] base::sink(type = "output", split = FALSE) [15:31:50.032] base::close(...future.stdout) [15:31:50.032] }, add = TRUE) [15:31:50.032] } [15:31:50.032] ...future.frame <- base::sys.nframe() [15:31:50.032] ...future.conditions <- base::list() [15:31:50.032] ...future.rng <- base::globalenv()$.Random.seed [15:31:50.032] if (FALSE) { [15:31:50.032] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:50.032] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:50.032] } [15:31:50.032] ...future.result <- base::tryCatch({ [15:31:50.032] base::withCallingHandlers({ [15:31:50.032] ...future.value <- base::withVisible(base::local({ [15:31:50.032] do.call(function(...) { [15:31:50.032] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:50.032] if (!identical(...future.globals.maxSize.org, [15:31:50.032] ...future.globals.maxSize)) { [15:31:50.032] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:50.032] on.exit(options(oopts), add = TRUE) [15:31:50.032] } [15:31:50.032] { [15:31:50.032] lapply(seq_along(...future.elements_ii), [15:31:50.032] FUN = function(jj) { [15:31:50.032] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:50.032] ...future.FUN(...future.X_jj, ...) [15:31:50.032] }) [15:31:50.032] } [15:31:50.032] }, args = future.call.arguments) [15:31:50.032] })) [15:31:50.032] future::FutureResult(value = ...future.value$value, [15:31:50.032] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:50.032] ...future.rng), globalenv = if (FALSE) [15:31:50.032] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:50.032] ...future.globalenv.names)) [15:31:50.032] else NULL, started = ...future.startTime, version = "1.8") [15:31:50.032] }, condition = base::local({ [15:31:50.032] c <- base::c [15:31:50.032] inherits <- base::inherits [15:31:50.032] invokeRestart <- base::invokeRestart [15:31:50.032] length <- base::length [15:31:50.032] list <- base::list [15:31:50.032] seq.int <- base::seq.int [15:31:50.032] signalCondition <- base::signalCondition [15:31:50.032] sys.calls <- base::sys.calls [15:31:50.032] `[[` <- base::`[[` [15:31:50.032] `+` <- base::`+` [15:31:50.032] `<<-` <- base::`<<-` [15:31:50.032] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:50.032] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:50.032] 3L)] [15:31:50.032] } [15:31:50.032] function(cond) { [15:31:50.032] is_error <- inherits(cond, "error") [15:31:50.032] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:50.032] NULL) [15:31:50.032] if (is_error) { [15:31:50.032] sessionInformation <- function() { [15:31:50.032] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:50.032] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:50.032] search = base::search(), system = base::Sys.info()) [15:31:50.032] } [15:31:50.032] ...future.conditions[[length(...future.conditions) + [15:31:50.032] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:50.032] cond$call), session = sessionInformation(), [15:31:50.032] timestamp = base::Sys.time(), signaled = 0L) [15:31:50.032] signalCondition(cond) [15:31:50.032] } [15:31:50.032] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:50.032] "immediateCondition"))) { [15:31:50.032] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:50.032] ...future.conditions[[length(...future.conditions) + [15:31:50.032] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:50.032] if (TRUE && !signal) { [15:31:50.032] muffleCondition <- function (cond, pattern = "^muffle") [15:31:50.032] { [15:31:50.032] inherits <- base::inherits [15:31:50.032] invokeRestart <- base::invokeRestart [15:31:50.032] is.null <- base::is.null [15:31:50.032] muffled <- FALSE [15:31:50.032] if (inherits(cond, "message")) { [15:31:50.032] muffled <- grepl(pattern, "muffleMessage") [15:31:50.032] if (muffled) [15:31:50.032] invokeRestart("muffleMessage") [15:31:50.032] } [15:31:50.032] else if (inherits(cond, "warning")) { [15:31:50.032] muffled <- grepl(pattern, "muffleWarning") [15:31:50.032] if (muffled) [15:31:50.032] invokeRestart("muffleWarning") [15:31:50.032] } [15:31:50.032] else if (inherits(cond, "condition")) { [15:31:50.032] if (!is.null(pattern)) { [15:31:50.032] computeRestarts <- base::computeRestarts [15:31:50.032] grepl <- base::grepl [15:31:50.032] restarts <- computeRestarts(cond) [15:31:50.032] for (restart in restarts) { [15:31:50.032] name <- restart$name [15:31:50.032] if (is.null(name)) [15:31:50.032] next [15:31:50.032] if (!grepl(pattern, name)) [15:31:50.032] next [15:31:50.032] invokeRestart(restart) [15:31:50.032] muffled <- TRUE [15:31:50.032] break [15:31:50.032] } [15:31:50.032] } [15:31:50.032] } [15:31:50.032] invisible(muffled) [15:31:50.032] } [15:31:50.032] muffleCondition(cond, pattern = "^muffle") [15:31:50.032] } [15:31:50.032] } [15:31:50.032] else { [15:31:50.032] if (TRUE) { [15:31:50.032] muffleCondition <- function (cond, pattern = "^muffle") [15:31:50.032] { [15:31:50.032] inherits <- base::inherits [15:31:50.032] invokeRestart <- base::invokeRestart [15:31:50.032] is.null <- base::is.null [15:31:50.032] muffled <- FALSE [15:31:50.032] if (inherits(cond, "message")) { [15:31:50.032] muffled <- grepl(pattern, "muffleMessage") [15:31:50.032] if (muffled) [15:31:50.032] invokeRestart("muffleMessage") [15:31:50.032] } [15:31:50.032] else if (inherits(cond, "warning")) { [15:31:50.032] muffled <- grepl(pattern, "muffleWarning") [15:31:50.032] if (muffled) [15:31:50.032] invokeRestart("muffleWarning") [15:31:50.032] } [15:31:50.032] else if (inherits(cond, "condition")) { [15:31:50.032] if (!is.null(pattern)) { [15:31:50.032] computeRestarts <- base::computeRestarts [15:31:50.032] grepl <- base::grepl [15:31:50.032] restarts <- computeRestarts(cond) [15:31:50.032] for (restart in restarts) { [15:31:50.032] name <- restart$name [15:31:50.032] if (is.null(name)) [15:31:50.032] next [15:31:50.032] if (!grepl(pattern, name)) [15:31:50.032] next [15:31:50.032] invokeRestart(restart) [15:31:50.032] muffled <- TRUE [15:31:50.032] break [15:31:50.032] } [15:31:50.032] } [15:31:50.032] } [15:31:50.032] invisible(muffled) [15:31:50.032] } [15:31:50.032] muffleCondition(cond, pattern = "^muffle") [15:31:50.032] } [15:31:50.032] } [15:31:50.032] } [15:31:50.032] })) [15:31:50.032] }, error = function(ex) { [15:31:50.032] base::structure(base::list(value = NULL, visible = NULL, [15:31:50.032] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:50.032] ...future.rng), started = ...future.startTime, [15:31:50.032] finished = Sys.time(), session_uuid = NA_character_, [15:31:50.032] version = "1.8"), class = "FutureResult") [15:31:50.032] }, finally = { [15:31:50.032] if (!identical(...future.workdir, getwd())) [15:31:50.032] setwd(...future.workdir) [15:31:50.032] { [15:31:50.032] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:50.032] ...future.oldOptions$nwarnings <- NULL [15:31:50.032] } [15:31:50.032] base::options(...future.oldOptions) [15:31:50.032] if (.Platform$OS.type == "windows") { [15:31:50.032] old_names <- names(...future.oldEnvVars) [15:31:50.032] envs <- base::Sys.getenv() [15:31:50.032] names <- names(envs) [15:31:50.032] common <- intersect(names, old_names) [15:31:50.032] added <- setdiff(names, old_names) [15:31:50.032] removed <- setdiff(old_names, names) [15:31:50.032] changed <- common[...future.oldEnvVars[common] != [15:31:50.032] envs[common]] [15:31:50.032] NAMES <- toupper(changed) [15:31:50.032] args <- list() [15:31:50.032] for (kk in seq_along(NAMES)) { [15:31:50.032] name <- changed[[kk]] [15:31:50.032] NAME <- NAMES[[kk]] [15:31:50.032] if (name != NAME && is.element(NAME, old_names)) [15:31:50.032] next [15:31:50.032] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:50.032] } [15:31:50.032] NAMES <- toupper(added) [15:31:50.032] for (kk in seq_along(NAMES)) { [15:31:50.032] name <- added[[kk]] [15:31:50.032] NAME <- NAMES[[kk]] [15:31:50.032] if (name != NAME && is.element(NAME, old_names)) [15:31:50.032] next [15:31:50.032] args[[name]] <- "" [15:31:50.032] } [15:31:50.032] NAMES <- toupper(removed) [15:31:50.032] for (kk in seq_along(NAMES)) { [15:31:50.032] name <- removed[[kk]] [15:31:50.032] NAME <- NAMES[[kk]] [15:31:50.032] if (name != NAME && is.element(NAME, old_names)) [15:31:50.032] next [15:31:50.032] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:50.032] } [15:31:50.032] if (length(args) > 0) [15:31:50.032] base::do.call(base::Sys.setenv, args = args) [15:31:50.032] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:50.032] } [15:31:50.032] else { [15:31:50.032] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:50.032] } [15:31:50.032] { [15:31:50.032] if (base::length(...future.futureOptionsAdded) > [15:31:50.032] 0L) { [15:31:50.032] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:50.032] base::names(opts) <- ...future.futureOptionsAdded [15:31:50.032] base::options(opts) [15:31:50.032] } [15:31:50.032] { [15:31:50.032] { [15:31:50.032] NULL [15:31:50.032] RNGkind("Mersenne-Twister") [15:31:50.032] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:50.032] inherits = FALSE) [15:31:50.032] } [15:31:50.032] options(future.plan = NULL) [15:31:50.032] if (is.na(NA_character_)) [15:31:50.032] Sys.unsetenv("R_FUTURE_PLAN") [15:31:50.032] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:50.032] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:50.032] .init = FALSE) [15:31:50.032] } [15:31:50.032] } [15:31:50.032] } [15:31:50.032] }) [15:31:50.032] if (TRUE) { [15:31:50.032] base::sink(type = "output", split = FALSE) [15:31:50.032] if (TRUE) { [15:31:50.032] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:50.032] } [15:31:50.032] else { [15:31:50.032] ...future.result["stdout"] <- base::list(NULL) [15:31:50.032] } [15:31:50.032] base::close(...future.stdout) [15:31:50.032] ...future.stdout <- NULL [15:31:50.032] } [15:31:50.032] ...future.result$conditions <- ...future.conditions [15:31:50.032] ...future.result$finished <- base::Sys.time() [15:31:50.032] ...future.result [15:31:50.032] } [15:31:50.040] assign_globals() ... [15:31:50.040] List of 5 [15:31:50.040] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:50.040] $ future.call.arguments :List of 1 [15:31:50.040] ..$ length: int 2 [15:31:50.040] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:50.040] $ ...future.elements_ii :List of 4 [15:31:50.040] ..$ c: chr "character" [15:31:50.040] ..$ a: chr "integer" [15:31:50.040] ..$ b: chr "numeric" [15:31:50.040] ..$ c: chr "list" [15:31:50.040] $ ...future.seeds_ii : NULL [15:31:50.040] $ ...future.globals.maxSize: NULL [15:31:50.040] - attr(*, "where")=List of 5 [15:31:50.040] ..$ ...future.FUN : [15:31:50.040] ..$ future.call.arguments : [15:31:50.040] ..$ ...future.elements_ii : [15:31:50.040] ..$ ...future.seeds_ii : [15:31:50.040] ..$ ...future.globals.maxSize: [15:31:50.040] - attr(*, "resolved")= logi FALSE [15:31:50.040] - attr(*, "total_size")= num 2240 [15:31:50.040] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:50.040] - attr(*, "already-done")= logi TRUE [15:31:50.053] - copied '...future.FUN' to environment [15:31:50.054] - copied 'future.call.arguments' to environment [15:31:50.054] - copied '...future.elements_ii' to environment [15:31:50.054] - copied '...future.seeds_ii' to environment [15:31:50.055] - copied '...future.globals.maxSize' to environment [15:31:50.055] assign_globals() ... done [15:31:50.056] plan(): Setting new future strategy stack: [15:31:50.056] List of future strategies: [15:31:50.056] 1. sequential: [15:31:50.056] - args: function (..., envir = parent.frame(), workers = "") [15:31:50.056] - tweaked: FALSE [15:31:50.056] - call: NULL [15:31:50.057] plan(): nbrOfWorkers() = 1 [15:31:50.060] plan(): Setting new future strategy stack: [15:31:50.060] List of future strategies: [15:31:50.060] 1. multisession: [15:31:50.060] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:50.060] - tweaked: FALSE [15:31:50.060] - call: plan(strategy) [15:31:50.065] plan(): nbrOfWorkers() = 1 [15:31:50.065] SequentialFuture started (and completed) [15:31:50.066] - Launch lazy future ... done [15:31:50.066] run() for 'SequentialFuture' ... done [15:31:50.067] Created future: [15:31:50.067] SequentialFuture: [15:31:50.067] Label: 'future_lapply-1' [15:31:50.067] Expression: [15:31:50.067] { [15:31:50.067] do.call(function(...) { [15:31:50.067] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:50.067] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:50.067] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:50.067] on.exit(options(oopts), add = TRUE) [15:31:50.067] } [15:31:50.067] { [15:31:50.067] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:50.067] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:50.067] ...future.FUN(...future.X_jj, ...) [15:31:50.067] }) [15:31:50.067] } [15:31:50.067] }, args = future.call.arguments) [15:31:50.067] } [15:31:50.067] Lazy evaluation: FALSE [15:31:50.067] Asynchronous evaluation: FALSE [15:31:50.067] Local evaluation: TRUE [15:31:50.067] Environment: R_GlobalEnv [15:31:50.067] Capture standard output: TRUE [15:31:50.067] Capture condition classes: 'condition' (excluding 'nothing') [15:31:50.067] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:50.067] Packages: [15:31:50.067] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:50.067] Resolved: TRUE [15:31:50.067] Value: 240 bytes of class 'list' [15:31:50.067] Early signaling: FALSE [15:31:50.067] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:50.067] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:50.070] Chunk #1 of 1 ... DONE [15:31:50.070] Launching 1 futures (chunks) ... DONE [15:31:50.070] Resolving 1 futures (chunks) ... [15:31:50.071] resolve() on list ... [15:31:50.071] recursive: 0 [15:31:50.071] length: 1 [15:31:50.072] [15:31:50.072] resolved() for 'SequentialFuture' ... [15:31:50.072] - state: 'finished' [15:31:50.073] - run: TRUE [15:31:50.073] - result: 'FutureResult' [15:31:50.073] resolved() for 'SequentialFuture' ... done [15:31:50.074] Future #1 [15:31:50.074] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:50.074] - nx: 1 [15:31:50.075] - relay: TRUE [15:31:50.075] - stdout: TRUE [15:31:50.075] - signal: TRUE [15:31:50.076] - resignal: FALSE [15:31:50.076] - force: TRUE [15:31:50.076] - relayed: [n=1] FALSE [15:31:50.076] - queued futures: [n=1] FALSE [15:31:50.077] - until=1 [15:31:50.077] - relaying element #1 [15:31:50.078] - relayed: [n=1] TRUE [15:31:50.078] - queued futures: [n=1] TRUE [15:31:50.078] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:50.079] length: 0 (resolved future 1) [15:31:50.079] Relaying remaining futures [15:31:50.079] signalConditionsASAP(NULL, pos=0) ... [15:31:50.080] - nx: 1 [15:31:50.080] - relay: TRUE [15:31:50.080] - stdout: TRUE [15:31:50.080] - signal: TRUE [15:31:50.081] - resignal: FALSE [15:31:50.081] - force: TRUE [15:31:50.081] - relayed: [n=1] TRUE [15:31:50.082] - queued futures: [n=1] TRUE - flush all [15:31:50.082] - relayed: [n=1] TRUE [15:31:50.082] - queued futures: [n=1] TRUE [15:31:50.083] signalConditionsASAP(NULL, pos=0) ... done [15:31:50.083] resolve() on list ... DONE [15:31:50.083] - Number of value chunks collected: 1 [15:31:50.084] Resolving 1 futures (chunks) ... DONE [15:31:50.084] Reducing values from 1 chunks ... [15:31:50.084] - Number of values collected after concatenation: 4 [15:31:50.085] - Number of values expected: 4 [15:31:50.085] Reverse index remapping (attribute 'ordering'): [n = 4] 2, 3, 1, 4 [15:31:50.085] Reducing values from 1 chunks ... DONE [15:31:50.086] 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, ...) ... [15:31:50.091] future_lapply() ... [15:31:50.112] Number of chunks: 1 [15:31:50.113] getGlobalsAndPackagesXApply() ... [15:31:50.113] - future.globals: TRUE [15:31:50.113] getGlobalsAndPackages() ... [15:31:50.114] Searching for globals... [15:31:50.139] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [15:31:50.140] Searching for globals ... DONE [15:31:50.140] Resolving globals: FALSE [15:31:50.142] The total size of the 1 globals is 69.62 KiB (71288 bytes) [15:31:50.143] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 69.62 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (69.62 KiB of class 'function') [15:31:50.143] - globals: [1] 'FUN' [15:31:50.144] - packages: [1] 'future' [15:31:50.144] getGlobalsAndPackages() ... DONE [15:31:50.144] - globals found/used: [n=1] 'FUN' [15:31:50.145] - needed namespaces: [n=1] 'future' [15:31:50.145] Finding globals ... DONE [15:31:50.145] - use_args: TRUE [15:31:50.146] - Getting '...' globals ... [15:31:50.147] resolve() on list ... [15:31:50.147] recursive: 0 [15:31:50.147] length: 1 [15:31:50.147] elements: '...' [15:31:50.148] length: 0 (resolved future 1) [15:31:50.148] resolve() on list ... DONE [15:31:50.148] - '...' content: [n=2] 'collapse', 'maxHead' [15:31:50.149] List of 1 [15:31:50.149] $ ...:List of 2 [15:31:50.149] ..$ collapse: chr "; " [15:31:50.149] ..$ maxHead : int 3 [15:31:50.149] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:50.149] - attr(*, "where")=List of 1 [15:31:50.149] ..$ ...: [15:31:50.149] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:50.149] - attr(*, "resolved")= logi TRUE [15:31:50.149] - attr(*, "total_size")= num NA [15:31:50.157] - Getting '...' globals ... DONE [15:31:50.157] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:50.157] List of 2 [15:31:50.157] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:50.157] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:50.157] $ ... :List of 2 [15:31:50.157] ..$ collapse: chr "; " [15:31:50.157] ..$ maxHead : int 3 [15:31:50.157] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:50.157] - attr(*, "where")=List of 2 [15:31:50.157] ..$ ...future.FUN: [15:31:50.157] ..$ ... : [15:31:50.157] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:50.157] - attr(*, "resolved")= logi FALSE [15:31:50.157] - attr(*, "total_size")= num 71456 [15:31:50.165] Packages to be attached in all futures: [n=1] 'future' [15:31:50.165] getGlobalsAndPackagesXApply() ... DONE [15:31:50.166] Number of futures (= number of chunks): 1 [15:31:50.166] Launching 1 futures (chunks) ... [15:31:50.166] Chunk #1 of 1 ... [15:31:50.167] - Finding globals in 'X' for chunk #1 ... [15:31:50.167] getGlobalsAndPackages() ... [15:31:50.167] Searching for globals... [15:31:50.168] [15:31:50.168] Searching for globals ... DONE [15:31:50.169] - globals: [0] [15:31:50.169] getGlobalsAndPackages() ... DONE [15:31:50.169] + additional globals found: [n=0] [15:31:50.169] + additional namespaces needed: [n=0] [15:31:50.170] - Finding globals in 'X' for chunk #1 ... DONE [15:31:50.170] - seeds: [15:31:50.170] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.171] getGlobalsAndPackages() ... [15:31:50.171] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.171] Resolving globals: FALSE [15:31:50.172] Tweak future expression to call with '...' arguments ... [15:31:50.172] { [15:31:50.172] do.call(function(...) { [15:31:50.172] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:50.172] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:50.172] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:50.172] on.exit(options(oopts), add = TRUE) [15:31:50.172] } [15:31:50.172] { [15:31:50.172] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:50.172] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:50.172] ...future.FUN(...future.X_jj, ...) [15:31:50.172] }) [15:31:50.172] } [15:31:50.172] }, args = future.call.arguments) [15:31:50.172] } [15:31:50.173] Tweak future expression to call with '...' arguments ... DONE [15:31:50.174] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.174] - packages: [1] 'future' [15:31:50.175] getGlobalsAndPackages() ... DONE [15:31:50.175] run() for 'Future' ... [15:31:50.176] - state: 'created' [15:31:50.176] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:50.181] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:50.181] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:50.182] - Field: 'label' [15:31:50.182] - Field: 'local' [15:31:50.182] - Field: 'owner' [15:31:50.183] - Field: 'envir' [15:31:50.183] - Field: 'packages' [15:31:50.183] - Field: 'gc' [15:31:50.184] - Field: 'conditions' [15:31:50.184] - Field: 'expr' [15:31:50.184] - Field: 'uuid' [15:31:50.185] - Field: 'seed' [15:31:50.185] - Field: 'version' [15:31:50.185] - Field: 'result' [15:31:50.186] - Field: 'asynchronous' [15:31:50.186] - Field: 'calls' [15:31:50.186] - Field: 'globals' [15:31:50.186] - Field: 'stdout' [15:31:50.187] - Field: 'earlySignal' [15:31:50.187] - Field: 'lazy' [15:31:50.187] - Field: 'state' [15:31:50.188] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:50.188] - Launch lazy future ... [15:31:50.188] Packages needed by the future expression (n = 1): 'future' [15:31:50.189] Packages needed by future strategies (n = 0): [15:31:50.190] { [15:31:50.190] { [15:31:50.190] { [15:31:50.190] ...future.startTime <- base::Sys.time() [15:31:50.190] { [15:31:50.190] { [15:31:50.190] { [15:31:50.190] { [15:31:50.190] base::local({ [15:31:50.190] has_future <- base::requireNamespace("future", [15:31:50.190] quietly = TRUE) [15:31:50.190] if (has_future) { [15:31:50.190] ns <- base::getNamespace("future") [15:31:50.190] version <- ns[[".package"]][["version"]] [15:31:50.190] if (is.null(version)) [15:31:50.190] version <- utils::packageVersion("future") [15:31:50.190] } [15:31:50.190] else { [15:31:50.190] version <- NULL [15:31:50.190] } [15:31:50.190] if (!has_future || version < "1.8.0") { [15:31:50.190] info <- base::c(r_version = base::gsub("R version ", [15:31:50.190] "", base::R.version$version.string), [15:31:50.190] platform = base::sprintf("%s (%s-bit)", [15:31:50.190] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:50.190] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:50.190] "release", "version")], collapse = " "), [15:31:50.190] hostname = base::Sys.info()[["nodename"]]) [15:31:50.190] info <- base::sprintf("%s: %s", base::names(info), [15:31:50.190] info) [15:31:50.190] info <- base::paste(info, collapse = "; ") [15:31:50.190] if (!has_future) { [15:31:50.190] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:50.190] info) [15:31:50.190] } [15:31:50.190] else { [15:31:50.190] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:50.190] info, version) [15:31:50.190] } [15:31:50.190] base::stop(msg) [15:31:50.190] } [15:31:50.190] }) [15:31:50.190] } [15:31:50.190] base::local({ [15:31:50.190] for (pkg in "future") { [15:31:50.190] base::loadNamespace(pkg) [15:31:50.190] base::library(pkg, character.only = TRUE) [15:31:50.190] } [15:31:50.190] }) [15:31:50.190] } [15:31:50.190] ...future.strategy.old <- future::plan("list") [15:31:50.190] options(future.plan = NULL) [15:31:50.190] Sys.unsetenv("R_FUTURE_PLAN") [15:31:50.190] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:50.190] } [15:31:50.190] ...future.workdir <- getwd() [15:31:50.190] } [15:31:50.190] ...future.oldOptions <- base::as.list(base::.Options) [15:31:50.190] ...future.oldEnvVars <- base::Sys.getenv() [15:31:50.190] } [15:31:50.190] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:50.190] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:50.190] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:50.190] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:50.190] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:50.190] future.stdout.windows.reencode = NULL, width = 80L) [15:31:50.190] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:50.190] base::names(...future.oldOptions)) [15:31:50.190] } [15:31:50.190] if (FALSE) { [15:31:50.190] } [15:31:50.190] else { [15:31:50.190] if (TRUE) { [15:31:50.190] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:50.190] open = "w") [15:31:50.190] } [15:31:50.190] else { [15:31:50.190] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:50.190] windows = "NUL", "/dev/null"), open = "w") [15:31:50.190] } [15:31:50.190] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:50.190] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:50.190] base::sink(type = "output", split = FALSE) [15:31:50.190] base::close(...future.stdout) [15:31:50.190] }, add = TRUE) [15:31:50.190] } [15:31:50.190] ...future.frame <- base::sys.nframe() [15:31:50.190] ...future.conditions <- base::list() [15:31:50.190] ...future.rng <- base::globalenv()$.Random.seed [15:31:50.190] if (FALSE) { [15:31:50.190] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:50.190] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:50.190] } [15:31:50.190] ...future.result <- base::tryCatch({ [15:31:50.190] base::withCallingHandlers({ [15:31:50.190] ...future.value <- base::withVisible(base::local({ [15:31:50.190] do.call(function(...) { [15:31:50.190] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:50.190] if (!identical(...future.globals.maxSize.org, [15:31:50.190] ...future.globals.maxSize)) { [15:31:50.190] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:50.190] on.exit(options(oopts), add = TRUE) [15:31:50.190] } [15:31:50.190] { [15:31:50.190] lapply(seq_along(...future.elements_ii), [15:31:50.190] FUN = function(jj) { [15:31:50.190] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:50.190] ...future.FUN(...future.X_jj, ...) [15:31:50.190] }) [15:31:50.190] } [15:31:50.190] }, args = future.call.arguments) [15:31:50.190] })) [15:31:50.190] future::FutureResult(value = ...future.value$value, [15:31:50.190] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:50.190] ...future.rng), globalenv = if (FALSE) [15:31:50.190] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:50.190] ...future.globalenv.names)) [15:31:50.190] else NULL, started = ...future.startTime, version = "1.8") [15:31:50.190] }, condition = base::local({ [15:31:50.190] c <- base::c [15:31:50.190] inherits <- base::inherits [15:31:50.190] invokeRestart <- base::invokeRestart [15:31:50.190] length <- base::length [15:31:50.190] list <- base::list [15:31:50.190] seq.int <- base::seq.int [15:31:50.190] signalCondition <- base::signalCondition [15:31:50.190] sys.calls <- base::sys.calls [15:31:50.190] `[[` <- base::`[[` [15:31:50.190] `+` <- base::`+` [15:31:50.190] `<<-` <- base::`<<-` [15:31:50.190] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:50.190] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:50.190] 3L)] [15:31:50.190] } [15:31:50.190] function(cond) { [15:31:50.190] is_error <- inherits(cond, "error") [15:31:50.190] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:50.190] NULL) [15:31:50.190] if (is_error) { [15:31:50.190] sessionInformation <- function() { [15:31:50.190] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:50.190] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:50.190] search = base::search(), system = base::Sys.info()) [15:31:50.190] } [15:31:50.190] ...future.conditions[[length(...future.conditions) + [15:31:50.190] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:50.190] cond$call), session = sessionInformation(), [15:31:50.190] timestamp = base::Sys.time(), signaled = 0L) [15:31:50.190] signalCondition(cond) [15:31:50.190] } [15:31:50.190] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:50.190] "immediateCondition"))) { [15:31:50.190] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:50.190] ...future.conditions[[length(...future.conditions) + [15:31:50.190] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:50.190] if (TRUE && !signal) { [15:31:50.190] muffleCondition <- function (cond, pattern = "^muffle") [15:31:50.190] { [15:31:50.190] inherits <- base::inherits [15:31:50.190] invokeRestart <- base::invokeRestart [15:31:50.190] is.null <- base::is.null [15:31:50.190] muffled <- FALSE [15:31:50.190] if (inherits(cond, "message")) { [15:31:50.190] muffled <- grepl(pattern, "muffleMessage") [15:31:50.190] if (muffled) [15:31:50.190] invokeRestart("muffleMessage") [15:31:50.190] } [15:31:50.190] else if (inherits(cond, "warning")) { [15:31:50.190] muffled <- grepl(pattern, "muffleWarning") [15:31:50.190] if (muffled) [15:31:50.190] invokeRestart("muffleWarning") [15:31:50.190] } [15:31:50.190] else if (inherits(cond, "condition")) { [15:31:50.190] if (!is.null(pattern)) { [15:31:50.190] computeRestarts <- base::computeRestarts [15:31:50.190] grepl <- base::grepl [15:31:50.190] restarts <- computeRestarts(cond) [15:31:50.190] for (restart in restarts) { [15:31:50.190] name <- restart$name [15:31:50.190] if (is.null(name)) [15:31:50.190] next [15:31:50.190] if (!grepl(pattern, name)) [15:31:50.190] next [15:31:50.190] invokeRestart(restart) [15:31:50.190] muffled <- TRUE [15:31:50.190] break [15:31:50.190] } [15:31:50.190] } [15:31:50.190] } [15:31:50.190] invisible(muffled) [15:31:50.190] } [15:31:50.190] muffleCondition(cond, pattern = "^muffle") [15:31:50.190] } [15:31:50.190] } [15:31:50.190] else { [15:31:50.190] if (TRUE) { [15:31:50.190] muffleCondition <- function (cond, pattern = "^muffle") [15:31:50.190] { [15:31:50.190] inherits <- base::inherits [15:31:50.190] invokeRestart <- base::invokeRestart [15:31:50.190] is.null <- base::is.null [15:31:50.190] muffled <- FALSE [15:31:50.190] if (inherits(cond, "message")) { [15:31:50.190] muffled <- grepl(pattern, "muffleMessage") [15:31:50.190] if (muffled) [15:31:50.190] invokeRestart("muffleMessage") [15:31:50.190] } [15:31:50.190] else if (inherits(cond, "warning")) { [15:31:50.190] muffled <- grepl(pattern, "muffleWarning") [15:31:50.190] if (muffled) [15:31:50.190] invokeRestart("muffleWarning") [15:31:50.190] } [15:31:50.190] else if (inherits(cond, "condition")) { [15:31:50.190] if (!is.null(pattern)) { [15:31:50.190] computeRestarts <- base::computeRestarts [15:31:50.190] grepl <- base::grepl [15:31:50.190] restarts <- computeRestarts(cond) [15:31:50.190] for (restart in restarts) { [15:31:50.190] name <- restart$name [15:31:50.190] if (is.null(name)) [15:31:50.190] next [15:31:50.190] if (!grepl(pattern, name)) [15:31:50.190] next [15:31:50.190] invokeRestart(restart) [15:31:50.190] muffled <- TRUE [15:31:50.190] break [15:31:50.190] } [15:31:50.190] } [15:31:50.190] } [15:31:50.190] invisible(muffled) [15:31:50.190] } [15:31:50.190] muffleCondition(cond, pattern = "^muffle") [15:31:50.190] } [15:31:50.190] } [15:31:50.190] } [15:31:50.190] })) [15:31:50.190] }, error = function(ex) { [15:31:50.190] base::structure(base::list(value = NULL, visible = NULL, [15:31:50.190] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:50.190] ...future.rng), started = ...future.startTime, [15:31:50.190] finished = Sys.time(), session_uuid = NA_character_, [15:31:50.190] version = "1.8"), class = "FutureResult") [15:31:50.190] }, finally = { [15:31:50.190] if (!identical(...future.workdir, getwd())) [15:31:50.190] setwd(...future.workdir) [15:31:50.190] { [15:31:50.190] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:50.190] ...future.oldOptions$nwarnings <- NULL [15:31:50.190] } [15:31:50.190] base::options(...future.oldOptions) [15:31:50.190] if (.Platform$OS.type == "windows") { [15:31:50.190] old_names <- names(...future.oldEnvVars) [15:31:50.190] envs <- base::Sys.getenv() [15:31:50.190] names <- names(envs) [15:31:50.190] common <- intersect(names, old_names) [15:31:50.190] added <- setdiff(names, old_names) [15:31:50.190] removed <- setdiff(old_names, names) [15:31:50.190] changed <- common[...future.oldEnvVars[common] != [15:31:50.190] envs[common]] [15:31:50.190] NAMES <- toupper(changed) [15:31:50.190] args <- list() [15:31:50.190] for (kk in seq_along(NAMES)) { [15:31:50.190] name <- changed[[kk]] [15:31:50.190] NAME <- NAMES[[kk]] [15:31:50.190] if (name != NAME && is.element(NAME, old_names)) [15:31:50.190] next [15:31:50.190] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:50.190] } [15:31:50.190] NAMES <- toupper(added) [15:31:50.190] for (kk in seq_along(NAMES)) { [15:31:50.190] name <- added[[kk]] [15:31:50.190] NAME <- NAMES[[kk]] [15:31:50.190] if (name != NAME && is.element(NAME, old_names)) [15:31:50.190] next [15:31:50.190] args[[name]] <- "" [15:31:50.190] } [15:31:50.190] NAMES <- toupper(removed) [15:31:50.190] for (kk in seq_along(NAMES)) { [15:31:50.190] name <- removed[[kk]] [15:31:50.190] NAME <- NAMES[[kk]] [15:31:50.190] if (name != NAME && is.element(NAME, old_names)) [15:31:50.190] next [15:31:50.190] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:50.190] } [15:31:50.190] if (length(args) > 0) [15:31:50.190] base::do.call(base::Sys.setenv, args = args) [15:31:50.190] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:50.190] } [15:31:50.190] else { [15:31:50.190] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:50.190] } [15:31:50.190] { [15:31:50.190] if (base::length(...future.futureOptionsAdded) > [15:31:50.190] 0L) { [15:31:50.190] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:50.190] base::names(opts) <- ...future.futureOptionsAdded [15:31:50.190] base::options(opts) [15:31:50.190] } [15:31:50.190] { [15:31:50.190] { [15:31:50.190] NULL [15:31:50.190] RNGkind("Mersenne-Twister") [15:31:50.190] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:50.190] inherits = FALSE) [15:31:50.190] } [15:31:50.190] options(future.plan = NULL) [15:31:50.190] if (is.na(NA_character_)) [15:31:50.190] Sys.unsetenv("R_FUTURE_PLAN") [15:31:50.190] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:50.190] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:50.190] .init = FALSE) [15:31:50.190] } [15:31:50.190] } [15:31:50.190] } [15:31:50.190] }) [15:31:50.190] if (TRUE) { [15:31:50.190] base::sink(type = "output", split = FALSE) [15:31:50.190] if (TRUE) { [15:31:50.190] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:50.190] } [15:31:50.190] else { [15:31:50.190] ...future.result["stdout"] <- base::list(NULL) [15:31:50.190] } [15:31:50.190] base::close(...future.stdout) [15:31:50.190] ...future.stdout <- NULL [15:31:50.190] } [15:31:50.190] ...future.result$conditions <- ...future.conditions [15:31:50.190] ...future.result$finished <- base::Sys.time() [15:31:50.190] ...future.result [15:31:50.190] } [15:31:50.197] assign_globals() ... [15:31:50.197] List of 5 [15:31:50.197] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:50.197] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:50.197] $ future.call.arguments :List of 2 [15:31:50.197] ..$ collapse: chr "; " [15:31:50.197] ..$ maxHead : int 3 [15:31:50.197] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:50.197] $ ...future.elements_ii :List of 1 [15:31:50.197] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [15:31:50.197] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [15:31:50.197] $ ...future.seeds_ii : NULL [15:31:50.197] $ ...future.globals.maxSize: NULL [15:31:50.197] - attr(*, "where")=List of 5 [15:31:50.197] ..$ ...future.FUN : [15:31:50.197] ..$ future.call.arguments : [15:31:50.197] ..$ ...future.elements_ii : [15:31:50.197] ..$ ...future.seeds_ii : [15:31:50.197] ..$ ...future.globals.maxSize: [15:31:50.197] - attr(*, "resolved")= logi FALSE [15:31:50.197] - attr(*, "total_size")= num 71456 [15:31:50.197] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:50.197] - attr(*, "already-done")= logi TRUE [15:31:50.208] - copied '...future.FUN' to environment [15:31:50.209] - copied 'future.call.arguments' to environment [15:31:50.209] - copied '...future.elements_ii' to environment [15:31:50.209] - copied '...future.seeds_ii' to environment [15:31:50.210] - copied '...future.globals.maxSize' to environment [15:31:50.210] assign_globals() ... done [15:31:50.211] plan(): Setting new future strategy stack: [15:31:50.211] List of future strategies: [15:31:50.211] 1. sequential: [15:31:50.211] - args: function (..., envir = parent.frame(), workers = "") [15:31:50.211] - tweaked: FALSE [15:31:50.211] - call: NULL [15:31:50.212] plan(): nbrOfWorkers() = 1 [15:31:50.214] plan(): Setting new future strategy stack: [15:31:50.215] List of future strategies: [15:31:50.215] 1. multisession: [15:31:50.215] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:50.215] - tweaked: FALSE [15:31:50.215] - call: plan(strategy) [15:31:50.219] plan(): nbrOfWorkers() = 1 [15:31:50.219] SequentialFuture started (and completed) [15:31:50.220] - Launch lazy future ... done [15:31:50.220] run() for 'SequentialFuture' ... done [15:31:50.220] Created future: [15:31:50.221] SequentialFuture: [15:31:50.221] Label: 'future_lapply-1' [15:31:50.221] Expression: [15:31:50.221] { [15:31:50.221] do.call(function(...) { [15:31:50.221] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:50.221] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:50.221] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:50.221] on.exit(options(oopts), add = TRUE) [15:31:50.221] } [15:31:50.221] { [15:31:50.221] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:50.221] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:50.221] ...future.FUN(...future.X_jj, ...) [15:31:50.221] }) [15:31:50.221] } [15:31:50.221] }, args = future.call.arguments) [15:31:50.221] } [15:31:50.221] Lazy evaluation: FALSE [15:31:50.221] Asynchronous evaluation: FALSE [15:31:50.221] Local evaluation: TRUE [15:31:50.221] Environment: R_GlobalEnv [15:31:50.221] Capture standard output: TRUE [15:31:50.221] Capture condition classes: 'condition' (excluding 'nothing') [15:31:50.221] Globals: 5 objects totaling 82.61 KiB (function '...future.FUN' of 69.62 KiB, DotDotDotList 'future.call.arguments' of 168 bytes, list '...future.elements_ii' of 12.83 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:50.221] Packages: 1 packages ('future') [15:31:50.221] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:50.221] Resolved: TRUE [15:31:50.221] Value: 136 bytes of class 'list' [15:31:50.221] Early signaling: FALSE [15:31:50.221] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:50.221] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:50.223] Chunk #1 of 1 ... DONE [15:31:50.223] Launching 1 futures (chunks) ... DONE [15:31:50.224] Resolving 1 futures (chunks) ... [15:31:50.224] resolve() on list ... [15:31:50.224] recursive: 0 [15:31:50.225] length: 1 [15:31:50.225] [15:31:50.225] resolved() for 'SequentialFuture' ... [15:31:50.226] - state: 'finished' [15:31:50.226] - run: TRUE [15:31:50.226] - result: 'FutureResult' [15:31:50.227] resolved() for 'SequentialFuture' ... done [15:31:50.227] Future #1 [15:31:50.227] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:50.228] - nx: 1 [15:31:50.228] - relay: TRUE [15:31:50.228] - stdout: TRUE [15:31:50.228] - signal: TRUE [15:31:50.229] - resignal: FALSE [15:31:50.229] - force: TRUE [15:31:50.229] - relayed: [n=1] FALSE [15:31:50.230] - queued futures: [n=1] FALSE [15:31:50.230] - until=1 [15:31:50.230] - relaying element #1 [15:31:50.231] - relayed: [n=1] TRUE [15:31:50.231] - queued futures: [n=1] TRUE [15:31:50.231] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:50.232] length: 0 (resolved future 1) [15:31:50.232] Relaying remaining futures [15:31:50.232] signalConditionsASAP(NULL, pos=0) ... [15:31:50.233] - nx: 1 [15:31:50.233] - relay: TRUE [15:31:50.233] - stdout: TRUE [15:31:50.233] - signal: TRUE [15:31:50.234] - resignal: FALSE [15:31:50.234] - force: TRUE [15:31:50.234] - relayed: [n=1] TRUE [15:31:50.234] - queued futures: [n=1] TRUE - flush all [15:31:50.235] - relayed: [n=1] TRUE [15:31:50.235] - queued futures: [n=1] TRUE [15:31:50.235] signalConditionsASAP(NULL, pos=0) ... done [15:31:50.236] resolve() on list ... DONE [15:31:50.236] - Number of value chunks collected: 1 [15:31:50.237] Resolving 1 futures (chunks) ... DONE [15:31:50.237] Reducing values from 1 chunks ... [15:31:50.237] - Number of values collected after concatenation: 1 [15:31:50.237] - Number of values expected: 1 [15:31:50.238] Reducing values from 1 chunks ... DONE [15:31:50.238] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [15:31:50.240] future_lapply() ... [15:31:50.246] Number of chunks: 1 [15:31:50.246] Index remapping (attribute 'ordering'): [n = 2] 2, 1 [15:31:50.246] getGlobalsAndPackagesXApply() ... [15:31:50.247] - future.globals: TRUE [15:31:50.247] getGlobalsAndPackages() ... [15:31:50.247] Searching for globals... [15:31:50.250] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [15:31:50.251] Searching for globals ... DONE [15:31:50.251] Resolving globals: FALSE [15:31:50.252] The total size of the 1 globals is 4.85 KiB (4968 bytes) [15:31:50.253] The total size of the 1 globals exported for future expression ('FUN()') is 4.85 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (4.85 KiB of class 'function') [15:31:50.253] - globals: [1] 'FUN' [15:31:50.253] - packages: [1] 'listenv' [15:31:50.254] getGlobalsAndPackages() ... DONE [15:31:50.254] - globals found/used: [n=1] 'FUN' [15:31:50.254] - needed namespaces: [n=1] 'listenv' [15:31:50.255] Finding globals ... DONE [15:31:50.255] - use_args: TRUE [15:31:50.255] - Getting '...' globals ... [15:31:50.256] resolve() on list ... [15:31:50.256] recursive: 0 [15:31:50.257] length: 1 [15:31:50.257] elements: '...' [15:31:50.257] length: 0 (resolved future 1) [15:31:50.257] resolve() on list ... DONE [15:31:50.258] - '...' content: [n=0] [15:31:50.258] List of 1 [15:31:50.258] $ ...: list() [15:31:50.258] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:50.258] - attr(*, "where")=List of 1 [15:31:50.258] ..$ ...: [15:31:50.258] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:50.258] - attr(*, "resolved")= logi TRUE [15:31:50.258] - attr(*, "total_size")= num NA [15:31:50.263] - Getting '...' globals ... DONE [15:31:50.264] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:50.264] List of 2 [15:31:50.264] $ ...future.FUN:function (x, ...) [15:31:50.264] $ ... : list() [15:31:50.264] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:50.264] - attr(*, "where")=List of 2 [15:31:50.264] ..$ ...future.FUN: [15:31:50.264] ..$ ... : [15:31:50.264] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:50.264] - attr(*, "resolved")= logi FALSE [15:31:50.264] - attr(*, "total_size")= num 4968 [15:31:50.269] Packages to be attached in all futures: [n=1] 'listenv' [15:31:50.270] getGlobalsAndPackagesXApply() ... DONE [15:31:50.270] Number of futures (= number of chunks): 1 [15:31:50.271] Launching 1 futures (chunks) ... [15:31:50.271] Chunk #1 of 1 ... [15:31:50.271] - Finding globals in 'X' for chunk #1 ... [15:31:50.271] getGlobalsAndPackages() ... [15:31:50.272] Searching for globals... [15:31:50.273] [15:31:50.273] Searching for globals ... DONE [15:31:50.273] - globals: [0] [15:31:50.274] getGlobalsAndPackages() ... DONE [15:31:50.274] + additional globals found: [n=0] [15:31:50.274] + additional namespaces needed: [n=0] [15:31:50.275] - Finding globals in 'X' for chunk #1 ... DONE [15:31:50.275] - seeds: [15:31:50.275] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.275] getGlobalsAndPackages() ... [15:31:50.276] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.276] Resolving globals: FALSE [15:31:50.276] Tweak future expression to call with '...' arguments ... [15:31:50.276] { [15:31:50.276] do.call(function(...) { [15:31:50.276] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:50.276] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:50.276] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:50.276] on.exit(options(oopts), add = TRUE) [15:31:50.276] } [15:31:50.276] { [15:31:50.276] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:50.276] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:50.276] ...future.FUN(...future.X_jj, ...) [15:31:50.276] }) [15:31:50.276] } [15:31:50.276] }, args = future.call.arguments) [15:31:50.276] } [15:31:50.277] Tweak future expression to call with '...' arguments ... DONE [15:31:50.278] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.278] - packages: [1] 'listenv' [15:31:50.279] getGlobalsAndPackages() ... DONE [15:31:50.279] run() for 'Future' ... [15:31:50.280] - state: 'created' [15:31:50.280] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:50.285] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:50.285] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:50.285] - Field: 'label' [15:31:50.286] - Field: 'local' [15:31:50.286] - Field: 'owner' [15:31:50.286] - Field: 'envir' [15:31:50.287] - Field: 'packages' [15:31:50.287] - Field: 'gc' [15:31:50.287] - Field: 'conditions' [15:31:50.288] - Field: 'expr' [15:31:50.288] - Field: 'uuid' [15:31:50.288] - Field: 'seed' [15:31:50.288] - Field: 'version' [15:31:50.289] - Field: 'result' [15:31:50.289] - Field: 'asynchronous' [15:31:50.289] - Field: 'calls' [15:31:50.289] - Field: 'globals' [15:31:50.290] - Field: 'stdout' [15:31:50.290] - Field: 'earlySignal' [15:31:50.290] - Field: 'lazy' [15:31:50.291] - Field: 'state' [15:31:50.291] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:50.291] - Launch lazy future ... [15:31:50.292] Packages needed by the future expression (n = 1): 'listenv' [15:31:50.292] Packages needed by future strategies (n = 0): [15:31:50.293] { [15:31:50.293] { [15:31:50.293] { [15:31:50.293] ...future.startTime <- base::Sys.time() [15:31:50.293] { [15:31:50.293] { [15:31:50.293] { [15:31:50.293] { [15:31:50.293] base::local({ [15:31:50.293] has_future <- base::requireNamespace("future", [15:31:50.293] quietly = TRUE) [15:31:50.293] if (has_future) { [15:31:50.293] ns <- base::getNamespace("future") [15:31:50.293] version <- ns[[".package"]][["version"]] [15:31:50.293] if (is.null(version)) [15:31:50.293] version <- utils::packageVersion("future") [15:31:50.293] } [15:31:50.293] else { [15:31:50.293] version <- NULL [15:31:50.293] } [15:31:50.293] if (!has_future || version < "1.8.0") { [15:31:50.293] info <- base::c(r_version = base::gsub("R version ", [15:31:50.293] "", base::R.version$version.string), [15:31:50.293] platform = base::sprintf("%s (%s-bit)", [15:31:50.293] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:50.293] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:50.293] "release", "version")], collapse = " "), [15:31:50.293] hostname = base::Sys.info()[["nodename"]]) [15:31:50.293] info <- base::sprintf("%s: %s", base::names(info), [15:31:50.293] info) [15:31:50.293] info <- base::paste(info, collapse = "; ") [15:31:50.293] if (!has_future) { [15:31:50.293] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:50.293] info) [15:31:50.293] } [15:31:50.293] else { [15:31:50.293] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:50.293] info, version) [15:31:50.293] } [15:31:50.293] base::stop(msg) [15:31:50.293] } [15:31:50.293] }) [15:31:50.293] } [15:31:50.293] base::local({ [15:31:50.293] for (pkg in "listenv") { [15:31:50.293] base::loadNamespace(pkg) [15:31:50.293] base::library(pkg, character.only = TRUE) [15:31:50.293] } [15:31:50.293] }) [15:31:50.293] } [15:31:50.293] ...future.strategy.old <- future::plan("list") [15:31:50.293] options(future.plan = NULL) [15:31:50.293] Sys.unsetenv("R_FUTURE_PLAN") [15:31:50.293] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:50.293] } [15:31:50.293] ...future.workdir <- getwd() [15:31:50.293] } [15:31:50.293] ...future.oldOptions <- base::as.list(base::.Options) [15:31:50.293] ...future.oldEnvVars <- base::Sys.getenv() [15:31:50.293] } [15:31:50.293] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:50.293] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:50.293] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:50.293] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:50.293] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:50.293] future.stdout.windows.reencode = NULL, width = 80L) [15:31:50.293] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:50.293] base::names(...future.oldOptions)) [15:31:50.293] } [15:31:50.293] if (FALSE) { [15:31:50.293] } [15:31:50.293] else { [15:31:50.293] if (TRUE) { [15:31:50.293] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:50.293] open = "w") [15:31:50.293] } [15:31:50.293] else { [15:31:50.293] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:50.293] windows = "NUL", "/dev/null"), open = "w") [15:31:50.293] } [15:31:50.293] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:50.293] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:50.293] base::sink(type = "output", split = FALSE) [15:31:50.293] base::close(...future.stdout) [15:31:50.293] }, add = TRUE) [15:31:50.293] } [15:31:50.293] ...future.frame <- base::sys.nframe() [15:31:50.293] ...future.conditions <- base::list() [15:31:50.293] ...future.rng <- base::globalenv()$.Random.seed [15:31:50.293] if (FALSE) { [15:31:50.293] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:50.293] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:50.293] } [15:31:50.293] ...future.result <- base::tryCatch({ [15:31:50.293] base::withCallingHandlers({ [15:31:50.293] ...future.value <- base::withVisible(base::local({ [15:31:50.293] do.call(function(...) { [15:31:50.293] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:50.293] if (!identical(...future.globals.maxSize.org, [15:31:50.293] ...future.globals.maxSize)) { [15:31:50.293] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:50.293] on.exit(options(oopts), add = TRUE) [15:31:50.293] } [15:31:50.293] { [15:31:50.293] lapply(seq_along(...future.elements_ii), [15:31:50.293] FUN = function(jj) { [15:31:50.293] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:50.293] ...future.FUN(...future.X_jj, ...) [15:31:50.293] }) [15:31:50.293] } [15:31:50.293] }, args = future.call.arguments) [15:31:50.293] })) [15:31:50.293] future::FutureResult(value = ...future.value$value, [15:31:50.293] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:50.293] ...future.rng), globalenv = if (FALSE) [15:31:50.293] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:50.293] ...future.globalenv.names)) [15:31:50.293] else NULL, started = ...future.startTime, version = "1.8") [15:31:50.293] }, condition = base::local({ [15:31:50.293] c <- base::c [15:31:50.293] inherits <- base::inherits [15:31:50.293] invokeRestart <- base::invokeRestart [15:31:50.293] length <- base::length [15:31:50.293] list <- base::list [15:31:50.293] seq.int <- base::seq.int [15:31:50.293] signalCondition <- base::signalCondition [15:31:50.293] sys.calls <- base::sys.calls [15:31:50.293] `[[` <- base::`[[` [15:31:50.293] `+` <- base::`+` [15:31:50.293] `<<-` <- base::`<<-` [15:31:50.293] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:50.293] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:50.293] 3L)] [15:31:50.293] } [15:31:50.293] function(cond) { [15:31:50.293] is_error <- inherits(cond, "error") [15:31:50.293] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:50.293] NULL) [15:31:50.293] if (is_error) { [15:31:50.293] sessionInformation <- function() { [15:31:50.293] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:50.293] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:50.293] search = base::search(), system = base::Sys.info()) [15:31:50.293] } [15:31:50.293] ...future.conditions[[length(...future.conditions) + [15:31:50.293] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:50.293] cond$call), session = sessionInformation(), [15:31:50.293] timestamp = base::Sys.time(), signaled = 0L) [15:31:50.293] signalCondition(cond) [15:31:50.293] } [15:31:50.293] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:50.293] "immediateCondition"))) { [15:31:50.293] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:50.293] ...future.conditions[[length(...future.conditions) + [15:31:50.293] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:50.293] if (TRUE && !signal) { [15:31:50.293] muffleCondition <- function (cond, pattern = "^muffle") [15:31:50.293] { [15:31:50.293] inherits <- base::inherits [15:31:50.293] invokeRestart <- base::invokeRestart [15:31:50.293] is.null <- base::is.null [15:31:50.293] muffled <- FALSE [15:31:50.293] if (inherits(cond, "message")) { [15:31:50.293] muffled <- grepl(pattern, "muffleMessage") [15:31:50.293] if (muffled) [15:31:50.293] invokeRestart("muffleMessage") [15:31:50.293] } [15:31:50.293] else if (inherits(cond, "warning")) { [15:31:50.293] muffled <- grepl(pattern, "muffleWarning") [15:31:50.293] if (muffled) [15:31:50.293] invokeRestart("muffleWarning") [15:31:50.293] } [15:31:50.293] else if (inherits(cond, "condition")) { [15:31:50.293] if (!is.null(pattern)) { [15:31:50.293] computeRestarts <- base::computeRestarts [15:31:50.293] grepl <- base::grepl [15:31:50.293] restarts <- computeRestarts(cond) [15:31:50.293] for (restart in restarts) { [15:31:50.293] name <- restart$name [15:31:50.293] if (is.null(name)) [15:31:50.293] next [15:31:50.293] if (!grepl(pattern, name)) [15:31:50.293] next [15:31:50.293] invokeRestart(restart) [15:31:50.293] muffled <- TRUE [15:31:50.293] break [15:31:50.293] } [15:31:50.293] } [15:31:50.293] } [15:31:50.293] invisible(muffled) [15:31:50.293] } [15:31:50.293] muffleCondition(cond, pattern = "^muffle") [15:31:50.293] } [15:31:50.293] } [15:31:50.293] else { [15:31:50.293] if (TRUE) { [15:31:50.293] muffleCondition <- function (cond, pattern = "^muffle") [15:31:50.293] { [15:31:50.293] inherits <- base::inherits [15:31:50.293] invokeRestart <- base::invokeRestart [15:31:50.293] is.null <- base::is.null [15:31:50.293] muffled <- FALSE [15:31:50.293] if (inherits(cond, "message")) { [15:31:50.293] muffled <- grepl(pattern, "muffleMessage") [15:31:50.293] if (muffled) [15:31:50.293] invokeRestart("muffleMessage") [15:31:50.293] } [15:31:50.293] else if (inherits(cond, "warning")) { [15:31:50.293] muffled <- grepl(pattern, "muffleWarning") [15:31:50.293] if (muffled) [15:31:50.293] invokeRestart("muffleWarning") [15:31:50.293] } [15:31:50.293] else if (inherits(cond, "condition")) { [15:31:50.293] if (!is.null(pattern)) { [15:31:50.293] computeRestarts <- base::computeRestarts [15:31:50.293] grepl <- base::grepl [15:31:50.293] restarts <- computeRestarts(cond) [15:31:50.293] for (restart in restarts) { [15:31:50.293] name <- restart$name [15:31:50.293] if (is.null(name)) [15:31:50.293] next [15:31:50.293] if (!grepl(pattern, name)) [15:31:50.293] next [15:31:50.293] invokeRestart(restart) [15:31:50.293] muffled <- TRUE [15:31:50.293] break [15:31:50.293] } [15:31:50.293] } [15:31:50.293] } [15:31:50.293] invisible(muffled) [15:31:50.293] } [15:31:50.293] muffleCondition(cond, pattern = "^muffle") [15:31:50.293] } [15:31:50.293] } [15:31:50.293] } [15:31:50.293] })) [15:31:50.293] }, error = function(ex) { [15:31:50.293] base::structure(base::list(value = NULL, visible = NULL, [15:31:50.293] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:50.293] ...future.rng), started = ...future.startTime, [15:31:50.293] finished = Sys.time(), session_uuid = NA_character_, [15:31:50.293] version = "1.8"), class = "FutureResult") [15:31:50.293] }, finally = { [15:31:50.293] if (!identical(...future.workdir, getwd())) [15:31:50.293] setwd(...future.workdir) [15:31:50.293] { [15:31:50.293] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:50.293] ...future.oldOptions$nwarnings <- NULL [15:31:50.293] } [15:31:50.293] base::options(...future.oldOptions) [15:31:50.293] if (.Platform$OS.type == "windows") { [15:31:50.293] old_names <- names(...future.oldEnvVars) [15:31:50.293] envs <- base::Sys.getenv() [15:31:50.293] names <- names(envs) [15:31:50.293] common <- intersect(names, old_names) [15:31:50.293] added <- setdiff(names, old_names) [15:31:50.293] removed <- setdiff(old_names, names) [15:31:50.293] changed <- common[...future.oldEnvVars[common] != [15:31:50.293] envs[common]] [15:31:50.293] NAMES <- toupper(changed) [15:31:50.293] args <- list() [15:31:50.293] for (kk in seq_along(NAMES)) { [15:31:50.293] name <- changed[[kk]] [15:31:50.293] NAME <- NAMES[[kk]] [15:31:50.293] if (name != NAME && is.element(NAME, old_names)) [15:31:50.293] next [15:31:50.293] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:50.293] } [15:31:50.293] NAMES <- toupper(added) [15:31:50.293] for (kk in seq_along(NAMES)) { [15:31:50.293] name <- added[[kk]] [15:31:50.293] NAME <- NAMES[[kk]] [15:31:50.293] if (name != NAME && is.element(NAME, old_names)) [15:31:50.293] next [15:31:50.293] args[[name]] <- "" [15:31:50.293] } [15:31:50.293] NAMES <- toupper(removed) [15:31:50.293] for (kk in seq_along(NAMES)) { [15:31:50.293] name <- removed[[kk]] [15:31:50.293] NAME <- NAMES[[kk]] [15:31:50.293] if (name != NAME && is.element(NAME, old_names)) [15:31:50.293] next [15:31:50.293] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:50.293] } [15:31:50.293] if (length(args) > 0) [15:31:50.293] base::do.call(base::Sys.setenv, args = args) [15:31:50.293] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:50.293] } [15:31:50.293] else { [15:31:50.293] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:50.293] } [15:31:50.293] { [15:31:50.293] if (base::length(...future.futureOptionsAdded) > [15:31:50.293] 0L) { [15:31:50.293] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:50.293] base::names(opts) <- ...future.futureOptionsAdded [15:31:50.293] base::options(opts) [15:31:50.293] } [15:31:50.293] { [15:31:50.293] { [15:31:50.293] NULL [15:31:50.293] RNGkind("Mersenne-Twister") [15:31:50.293] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:50.293] inherits = FALSE) [15:31:50.293] } [15:31:50.293] options(future.plan = NULL) [15:31:50.293] if (is.na(NA_character_)) [15:31:50.293] Sys.unsetenv("R_FUTURE_PLAN") [15:31:50.293] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:50.293] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:50.293] .init = FALSE) [15:31:50.293] } [15:31:50.293] } [15:31:50.293] } [15:31:50.293] }) [15:31:50.293] if (TRUE) { [15:31:50.293] base::sink(type = "output", split = FALSE) [15:31:50.293] if (TRUE) { [15:31:50.293] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:50.293] } [15:31:50.293] else { [15:31:50.293] ...future.result["stdout"] <- base::list(NULL) [15:31:50.293] } [15:31:50.293] base::close(...future.stdout) [15:31:50.293] ...future.stdout <- NULL [15:31:50.293] } [15:31:50.293] ...future.result$conditions <- ...future.conditions [15:31:50.293] ...future.result$finished <- base::Sys.time() [15:31:50.293] ...future.result [15:31:50.293] } [15:31:50.300] assign_globals() ... [15:31:50.300] List of 5 [15:31:50.300] $ ...future.FUN :function (x, ...) [15:31:50.300] $ future.call.arguments : list() [15:31:50.300] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:50.300] $ ...future.elements_ii :List of 2 [15:31:50.300] ..$ b:Classes 'listenv', 'environment' [15:31:50.300] ..$ a:Classes 'listenv', 'environment' [15:31:50.300] $ ...future.seeds_ii : NULL [15:31:50.300] $ ...future.globals.maxSize: NULL [15:31:50.300] - attr(*, "where")=List of 5 [15:31:50.300] ..$ ...future.FUN : [15:31:50.300] ..$ future.call.arguments : [15:31:50.300] ..$ ...future.elements_ii : [15:31:50.300] ..$ ...future.seeds_ii : [15:31:50.300] ..$ ...future.globals.maxSize: [15:31:50.300] - attr(*, "resolved")= logi FALSE [15:31:50.300] - attr(*, "total_size")= num 4968 [15:31:50.300] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:50.300] - attr(*, "already-done")= logi TRUE [15:31:50.310] - copied '...future.FUN' to environment [15:31:50.311] - copied 'future.call.arguments' to environment [15:31:50.311] - copied '...future.elements_ii' to environment [15:31:50.311] - copied '...future.seeds_ii' to environment [15:31:50.311] - copied '...future.globals.maxSize' to environment [15:31:50.312] assign_globals() ... done [15:31:50.313] plan(): Setting new future strategy stack: [15:31:50.313] List of future strategies: [15:31:50.313] 1. sequential: [15:31:50.313] - args: function (..., envir = parent.frame(), workers = "") [15:31:50.313] - tweaked: FALSE [15:31:50.313] - call: NULL [15:31:50.314] plan(): nbrOfWorkers() = 1 [15:31:50.316] plan(): Setting new future strategy stack: [15:31:50.317] List of future strategies: [15:31:50.317] 1. multisession: [15:31:50.317] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:50.317] - tweaked: FALSE [15:31:50.317] - call: plan(strategy) [15:31:50.321] plan(): nbrOfWorkers() = 1 [15:31:50.321] SequentialFuture started (and completed) [15:31:50.322] - Launch lazy future ... done [15:31:50.322] run() for 'SequentialFuture' ... done [15:31:50.322] Created future: [15:31:50.322] SequentialFuture: [15:31:50.322] Label: 'future_lapply-1' [15:31:50.322] Expression: [15:31:50.322] { [15:31:50.322] do.call(function(...) { [15:31:50.322] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:50.322] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:50.322] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:50.322] on.exit(options(oopts), add = TRUE) [15:31:50.322] } [15:31:50.322] { [15:31:50.322] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:50.322] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:50.322] ...future.FUN(...future.X_jj, ...) [15:31:50.322] }) [15:31:50.322] } [15:31:50.322] }, args = future.call.arguments) [15:31:50.322] } [15:31:50.322] Lazy evaluation: FALSE [15:31:50.322] Asynchronous evaluation: FALSE [15:31:50.322] Local evaluation: TRUE [15:31:50.322] Environment: R_GlobalEnv [15:31:50.322] Capture standard output: TRUE [15:31:50.322] Capture condition classes: 'condition' (excluding 'nothing') [15:31:50.322] Globals: 5 objects totaling 17.90 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 13.05 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:50.322] Packages: 1 packages ('listenv') [15:31:50.322] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:50.322] Resolved: TRUE [15:31:50.322] Value: 800 bytes of class 'list' [15:31:50.322] Early signaling: FALSE [15:31:50.322] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:50.322] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:50.325] Chunk #1 of 1 ... DONE [15:31:50.325] Launching 1 futures (chunks) ... DONE [15:31:50.326] Resolving 1 futures (chunks) ... [15:31:50.326] resolve() on list ... [15:31:50.332] recursive: 0 [15:31:50.333] length: 1 [15:31:50.333] [15:31:50.334] resolved() for 'SequentialFuture' ... [15:31:50.334] - state: 'finished' [15:31:50.334] - run: TRUE [15:31:50.335] - result: 'FutureResult' [15:31:50.335] resolved() for 'SequentialFuture' ... done [15:31:50.335] Future #1 [15:31:50.336] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:50.336] - nx: 1 [15:31:50.336] - relay: TRUE [15:31:50.337] - stdout: TRUE [15:31:50.337] - signal: TRUE [15:31:50.337] - resignal: FALSE [15:31:50.337] - force: TRUE [15:31:50.338] - relayed: [n=1] FALSE [15:31:50.338] - queued futures: [n=1] FALSE [15:31:50.338] - until=1 [15:31:50.338] - relaying element #1 [15:31:50.339] - relayed: [n=1] TRUE [15:31:50.339] - queued futures: [n=1] TRUE [15:31:50.340] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:50.340] length: 0 (resolved future 1) [15:31:50.340] Relaying remaining futures [15:31:50.340] signalConditionsASAP(NULL, pos=0) ... [15:31:50.341] - nx: 1 [15:31:50.341] - relay: TRUE [15:31:50.341] - stdout: TRUE [15:31:50.341] - signal: TRUE [15:31:50.342] - resignal: FALSE [15:31:50.342] - force: TRUE [15:31:50.342] - relayed: [n=1] TRUE [15:31:50.343] - queued futures: [n=1] TRUE - flush all [15:31:50.343] - relayed: [n=1] TRUE [15:31:50.343] - queued futures: [n=1] TRUE [15:31:50.344] signalConditionsASAP(NULL, pos=0) ... done [15:31:50.344] resolve() on list ... DONE [15:31:50.344] - Number of value chunks collected: 1 [15:31:50.345] Resolving 1 futures (chunks) ... DONE [15:31:50.345] Reducing values from 1 chunks ... [15:31:50.345] - Number of values collected after concatenation: 2 [15:31:50.345] - Number of values expected: 2 [15:31:50.346] Reverse index remapping (attribute 'ordering'): [n = 2] 2, 1 [15:31:50.346] Reducing values from 1 chunks ... DONE [15:31:50.346] 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, ...) ... [15:31:50.350] future_lapply() ... [15:31:50.355] Number of chunks: 1 [15:31:50.356] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [15:31:50.356] getGlobalsAndPackagesXApply() ... [15:31:50.356] - future.globals: TRUE [15:31:50.357] getGlobalsAndPackages() ... [15:31:50.357] Searching for globals... [15:31:50.360] - globals found: [2] 'FUN', '.Internal' [15:31:50.360] Searching for globals ... DONE [15:31:50.360] Resolving globals: FALSE [15:31:50.361] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:50.362] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:50.362] - globals: [1] 'FUN' [15:31:50.363] [15:31:50.363] getGlobalsAndPackages() ... DONE [15:31:50.363] - globals found/used: [n=1] 'FUN' [15:31:50.363] - needed namespaces: [n=0] [15:31:50.364] Finding globals ... DONE [15:31:50.364] - use_args: TRUE [15:31:50.364] - Getting '...' globals ... [15:31:50.365] resolve() on list ... [15:31:50.365] recursive: 0 [15:31:50.366] length: 1 [15:31:50.366] elements: '...' [15:31:50.366] length: 0 (resolved future 1) [15:31:50.366] resolve() on list ... DONE [15:31:50.367] - '...' content: [n=1] 'length' [15:31:50.367] List of 1 [15:31:50.367] $ ...:List of 1 [15:31:50.367] ..$ length: int 2 [15:31:50.367] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:50.367] - attr(*, "where")=List of 1 [15:31:50.367] ..$ ...: [15:31:50.367] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:50.367] - attr(*, "resolved")= logi TRUE [15:31:50.367] - attr(*, "total_size")= num NA [15:31:50.373] - Getting '...' globals ... DONE [15:31:50.373] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:50.374] List of 2 [15:31:50.374] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:50.374] $ ... :List of 1 [15:31:50.374] ..$ length: int 2 [15:31:50.374] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:50.374] - attr(*, "where")=List of 2 [15:31:50.374] ..$ ...future.FUN: [15:31:50.374] ..$ ... : [15:31:50.374] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:50.374] - attr(*, "resolved")= logi FALSE [15:31:50.374] - attr(*, "total_size")= num 2240 [15:31:50.379] Packages to be attached in all futures: [n=0] [15:31:50.380] getGlobalsAndPackagesXApply() ... DONE [15:31:50.380] Number of futures (= number of chunks): 1 [15:31:50.381] Launching 1 futures (chunks) ... [15:31:50.381] Chunk #1 of 1 ... [15:31:50.381] - Finding globals in 'X' for chunk #1 ... [15:31:50.381] getGlobalsAndPackages() ... [15:31:50.382] Searching for globals... [15:31:50.382] [15:31:50.383] Searching for globals ... DONE [15:31:50.383] - globals: [0] [15:31:50.383] getGlobalsAndPackages() ... DONE [15:31:50.383] + additional globals found: [n=0] [15:31:50.383] + additional namespaces needed: [n=0] [15:31:50.384] - Finding globals in 'X' for chunk #1 ... DONE [15:31:50.384] - seeds: [15:31:50.384] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.385] getGlobalsAndPackages() ... [15:31:50.385] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.385] Resolving globals: FALSE [15:31:50.386] Tweak future expression to call with '...' arguments ... [15:31:50.386] { [15:31:50.386] do.call(function(...) { [15:31:50.386] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:50.386] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:50.386] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:50.386] on.exit(options(oopts), add = TRUE) [15:31:50.386] } [15:31:50.386] { [15:31:50.386] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:50.386] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:50.386] ...future.FUN(...future.X_jj, ...) [15:31:50.386] }) [15:31:50.386] } [15:31:50.386] }, args = future.call.arguments) [15:31:50.386] } [15:31:50.387] Tweak future expression to call with '...' arguments ... DONE [15:31:50.387] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.388] [15:31:50.388] getGlobalsAndPackages() ... DONE [15:31:50.389] run() for 'Future' ... [15:31:50.389] - state: 'created' [15:31:50.389] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:50.394] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:50.394] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:50.394] - Field: 'label' [15:31:50.395] - Field: 'local' [15:31:50.395] - Field: 'owner' [15:31:50.395] - Field: 'envir' [15:31:50.395] - Field: 'packages' [15:31:50.396] - Field: 'gc' [15:31:50.396] - Field: 'conditions' [15:31:50.396] - Field: 'expr' [15:31:50.397] - Field: 'uuid' [15:31:50.397] - Field: 'seed' [15:31:50.397] - Field: 'version' [15:31:50.397] - Field: 'result' [15:31:50.398] - Field: 'asynchronous' [15:31:50.398] - Field: 'calls' [15:31:50.398] - Field: 'globals' [15:31:50.398] - Field: 'stdout' [15:31:50.399] - Field: 'earlySignal' [15:31:50.399] - Field: 'lazy' [15:31:50.399] - Field: 'state' [15:31:50.400] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:50.400] - Launch lazy future ... [15:31:50.400] Packages needed by the future expression (n = 0): [15:31:50.401] Packages needed by future strategies (n = 0): [15:31:50.402] { [15:31:50.402] { [15:31:50.402] { [15:31:50.402] ...future.startTime <- base::Sys.time() [15:31:50.402] { [15:31:50.402] { [15:31:50.402] { [15:31:50.402] base::local({ [15:31:50.402] has_future <- base::requireNamespace("future", [15:31:50.402] quietly = TRUE) [15:31:50.402] if (has_future) { [15:31:50.402] ns <- base::getNamespace("future") [15:31:50.402] version <- ns[[".package"]][["version"]] [15:31:50.402] if (is.null(version)) [15:31:50.402] version <- utils::packageVersion("future") [15:31:50.402] } [15:31:50.402] else { [15:31:50.402] version <- NULL [15:31:50.402] } [15:31:50.402] if (!has_future || version < "1.8.0") { [15:31:50.402] info <- base::c(r_version = base::gsub("R version ", [15:31:50.402] "", base::R.version$version.string), [15:31:50.402] platform = base::sprintf("%s (%s-bit)", [15:31:50.402] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:50.402] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:50.402] "release", "version")], collapse = " "), [15:31:50.402] hostname = base::Sys.info()[["nodename"]]) [15:31:50.402] info <- base::sprintf("%s: %s", base::names(info), [15:31:50.402] info) [15:31:50.402] info <- base::paste(info, collapse = "; ") [15:31:50.402] if (!has_future) { [15:31:50.402] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:50.402] info) [15:31:50.402] } [15:31:50.402] else { [15:31:50.402] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:50.402] info, version) [15:31:50.402] } [15:31:50.402] base::stop(msg) [15:31:50.402] } [15:31:50.402] }) [15:31:50.402] } [15:31:50.402] ...future.strategy.old <- future::plan("list") [15:31:50.402] options(future.plan = NULL) [15:31:50.402] Sys.unsetenv("R_FUTURE_PLAN") [15:31:50.402] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:50.402] } [15:31:50.402] ...future.workdir <- getwd() [15:31:50.402] } [15:31:50.402] ...future.oldOptions <- base::as.list(base::.Options) [15:31:50.402] ...future.oldEnvVars <- base::Sys.getenv() [15:31:50.402] } [15:31:50.402] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:50.402] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:50.402] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:50.402] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:50.402] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:50.402] future.stdout.windows.reencode = NULL, width = 80L) [15:31:50.402] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:50.402] base::names(...future.oldOptions)) [15:31:50.402] } [15:31:50.402] if (FALSE) { [15:31:50.402] } [15:31:50.402] else { [15:31:50.402] if (TRUE) { [15:31:50.402] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:50.402] open = "w") [15:31:50.402] } [15:31:50.402] else { [15:31:50.402] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:50.402] windows = "NUL", "/dev/null"), open = "w") [15:31:50.402] } [15:31:50.402] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:50.402] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:50.402] base::sink(type = "output", split = FALSE) [15:31:50.402] base::close(...future.stdout) [15:31:50.402] }, add = TRUE) [15:31:50.402] } [15:31:50.402] ...future.frame <- base::sys.nframe() [15:31:50.402] ...future.conditions <- base::list() [15:31:50.402] ...future.rng <- base::globalenv()$.Random.seed [15:31:50.402] if (FALSE) { [15:31:50.402] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:50.402] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:50.402] } [15:31:50.402] ...future.result <- base::tryCatch({ [15:31:50.402] base::withCallingHandlers({ [15:31:50.402] ...future.value <- base::withVisible(base::local({ [15:31:50.402] do.call(function(...) { [15:31:50.402] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:50.402] if (!identical(...future.globals.maxSize.org, [15:31:50.402] ...future.globals.maxSize)) { [15:31:50.402] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:50.402] on.exit(options(oopts), add = TRUE) [15:31:50.402] } [15:31:50.402] { [15:31:50.402] lapply(seq_along(...future.elements_ii), [15:31:50.402] FUN = function(jj) { [15:31:50.402] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:50.402] ...future.FUN(...future.X_jj, ...) [15:31:50.402] }) [15:31:50.402] } [15:31:50.402] }, args = future.call.arguments) [15:31:50.402] })) [15:31:50.402] future::FutureResult(value = ...future.value$value, [15:31:50.402] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:50.402] ...future.rng), globalenv = if (FALSE) [15:31:50.402] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:50.402] ...future.globalenv.names)) [15:31:50.402] else NULL, started = ...future.startTime, version = "1.8") [15:31:50.402] }, condition = base::local({ [15:31:50.402] c <- base::c [15:31:50.402] inherits <- base::inherits [15:31:50.402] invokeRestart <- base::invokeRestart [15:31:50.402] length <- base::length [15:31:50.402] list <- base::list [15:31:50.402] seq.int <- base::seq.int [15:31:50.402] signalCondition <- base::signalCondition [15:31:50.402] sys.calls <- base::sys.calls [15:31:50.402] `[[` <- base::`[[` [15:31:50.402] `+` <- base::`+` [15:31:50.402] `<<-` <- base::`<<-` [15:31:50.402] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:50.402] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:50.402] 3L)] [15:31:50.402] } [15:31:50.402] function(cond) { [15:31:50.402] is_error <- inherits(cond, "error") [15:31:50.402] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:50.402] NULL) [15:31:50.402] if (is_error) { [15:31:50.402] sessionInformation <- function() { [15:31:50.402] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:50.402] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:50.402] search = base::search(), system = base::Sys.info()) [15:31:50.402] } [15:31:50.402] ...future.conditions[[length(...future.conditions) + [15:31:50.402] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:50.402] cond$call), session = sessionInformation(), [15:31:50.402] timestamp = base::Sys.time(), signaled = 0L) [15:31:50.402] signalCondition(cond) [15:31:50.402] } [15:31:50.402] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:50.402] "immediateCondition"))) { [15:31:50.402] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:50.402] ...future.conditions[[length(...future.conditions) + [15:31:50.402] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:50.402] if (TRUE && !signal) { [15:31:50.402] muffleCondition <- function (cond, pattern = "^muffle") [15:31:50.402] { [15:31:50.402] inherits <- base::inherits [15:31:50.402] invokeRestart <- base::invokeRestart [15:31:50.402] is.null <- base::is.null [15:31:50.402] muffled <- FALSE [15:31:50.402] if (inherits(cond, "message")) { [15:31:50.402] muffled <- grepl(pattern, "muffleMessage") [15:31:50.402] if (muffled) [15:31:50.402] invokeRestart("muffleMessage") [15:31:50.402] } [15:31:50.402] else if (inherits(cond, "warning")) { [15:31:50.402] muffled <- grepl(pattern, "muffleWarning") [15:31:50.402] if (muffled) [15:31:50.402] invokeRestart("muffleWarning") [15:31:50.402] } [15:31:50.402] else if (inherits(cond, "condition")) { [15:31:50.402] if (!is.null(pattern)) { [15:31:50.402] computeRestarts <- base::computeRestarts [15:31:50.402] grepl <- base::grepl [15:31:50.402] restarts <- computeRestarts(cond) [15:31:50.402] for (restart in restarts) { [15:31:50.402] name <- restart$name [15:31:50.402] if (is.null(name)) [15:31:50.402] next [15:31:50.402] if (!grepl(pattern, name)) [15:31:50.402] next [15:31:50.402] invokeRestart(restart) [15:31:50.402] muffled <- TRUE [15:31:50.402] break [15:31:50.402] } [15:31:50.402] } [15:31:50.402] } [15:31:50.402] invisible(muffled) [15:31:50.402] } [15:31:50.402] muffleCondition(cond, pattern = "^muffle") [15:31:50.402] } [15:31:50.402] } [15:31:50.402] else { [15:31:50.402] if (TRUE) { [15:31:50.402] muffleCondition <- function (cond, pattern = "^muffle") [15:31:50.402] { [15:31:50.402] inherits <- base::inherits [15:31:50.402] invokeRestart <- base::invokeRestart [15:31:50.402] is.null <- base::is.null [15:31:50.402] muffled <- FALSE [15:31:50.402] if (inherits(cond, "message")) { [15:31:50.402] muffled <- grepl(pattern, "muffleMessage") [15:31:50.402] if (muffled) [15:31:50.402] invokeRestart("muffleMessage") [15:31:50.402] } [15:31:50.402] else if (inherits(cond, "warning")) { [15:31:50.402] muffled <- grepl(pattern, "muffleWarning") [15:31:50.402] if (muffled) [15:31:50.402] invokeRestart("muffleWarning") [15:31:50.402] } [15:31:50.402] else if (inherits(cond, "condition")) { [15:31:50.402] if (!is.null(pattern)) { [15:31:50.402] computeRestarts <- base::computeRestarts [15:31:50.402] grepl <- base::grepl [15:31:50.402] restarts <- computeRestarts(cond) [15:31:50.402] for (restart in restarts) { [15:31:50.402] name <- restart$name [15:31:50.402] if (is.null(name)) [15:31:50.402] next [15:31:50.402] if (!grepl(pattern, name)) [15:31:50.402] next [15:31:50.402] invokeRestart(restart) [15:31:50.402] muffled <- TRUE [15:31:50.402] break [15:31:50.402] } [15:31:50.402] } [15:31:50.402] } [15:31:50.402] invisible(muffled) [15:31:50.402] } [15:31:50.402] muffleCondition(cond, pattern = "^muffle") [15:31:50.402] } [15:31:50.402] } [15:31:50.402] } [15:31:50.402] })) [15:31:50.402] }, error = function(ex) { [15:31:50.402] base::structure(base::list(value = NULL, visible = NULL, [15:31:50.402] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:50.402] ...future.rng), started = ...future.startTime, [15:31:50.402] finished = Sys.time(), session_uuid = NA_character_, [15:31:50.402] version = "1.8"), class = "FutureResult") [15:31:50.402] }, finally = { [15:31:50.402] if (!identical(...future.workdir, getwd())) [15:31:50.402] setwd(...future.workdir) [15:31:50.402] { [15:31:50.402] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:50.402] ...future.oldOptions$nwarnings <- NULL [15:31:50.402] } [15:31:50.402] base::options(...future.oldOptions) [15:31:50.402] if (.Platform$OS.type == "windows") { [15:31:50.402] old_names <- names(...future.oldEnvVars) [15:31:50.402] envs <- base::Sys.getenv() [15:31:50.402] names <- names(envs) [15:31:50.402] common <- intersect(names, old_names) [15:31:50.402] added <- setdiff(names, old_names) [15:31:50.402] removed <- setdiff(old_names, names) [15:31:50.402] changed <- common[...future.oldEnvVars[common] != [15:31:50.402] envs[common]] [15:31:50.402] NAMES <- toupper(changed) [15:31:50.402] args <- list() [15:31:50.402] for (kk in seq_along(NAMES)) { [15:31:50.402] name <- changed[[kk]] [15:31:50.402] NAME <- NAMES[[kk]] [15:31:50.402] if (name != NAME && is.element(NAME, old_names)) [15:31:50.402] next [15:31:50.402] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:50.402] } [15:31:50.402] NAMES <- toupper(added) [15:31:50.402] for (kk in seq_along(NAMES)) { [15:31:50.402] name <- added[[kk]] [15:31:50.402] NAME <- NAMES[[kk]] [15:31:50.402] if (name != NAME && is.element(NAME, old_names)) [15:31:50.402] next [15:31:50.402] args[[name]] <- "" [15:31:50.402] } [15:31:50.402] NAMES <- toupper(removed) [15:31:50.402] for (kk in seq_along(NAMES)) { [15:31:50.402] name <- removed[[kk]] [15:31:50.402] NAME <- NAMES[[kk]] [15:31:50.402] if (name != NAME && is.element(NAME, old_names)) [15:31:50.402] next [15:31:50.402] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:50.402] } [15:31:50.402] if (length(args) > 0) [15:31:50.402] base::do.call(base::Sys.setenv, args = args) [15:31:50.402] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:50.402] } [15:31:50.402] else { [15:31:50.402] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:50.402] } [15:31:50.402] { [15:31:50.402] if (base::length(...future.futureOptionsAdded) > [15:31:50.402] 0L) { [15:31:50.402] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:50.402] base::names(opts) <- ...future.futureOptionsAdded [15:31:50.402] base::options(opts) [15:31:50.402] } [15:31:50.402] { [15:31:50.402] { [15:31:50.402] NULL [15:31:50.402] RNGkind("Mersenne-Twister") [15:31:50.402] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:50.402] inherits = FALSE) [15:31:50.402] } [15:31:50.402] options(future.plan = NULL) [15:31:50.402] if (is.na(NA_character_)) [15:31:50.402] Sys.unsetenv("R_FUTURE_PLAN") [15:31:50.402] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:50.402] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:50.402] .init = FALSE) [15:31:50.402] } [15:31:50.402] } [15:31:50.402] } [15:31:50.402] }) [15:31:50.402] if (TRUE) { [15:31:50.402] base::sink(type = "output", split = FALSE) [15:31:50.402] if (TRUE) { [15:31:50.402] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:50.402] } [15:31:50.402] else { [15:31:50.402] ...future.result["stdout"] <- base::list(NULL) [15:31:50.402] } [15:31:50.402] base::close(...future.stdout) [15:31:50.402] ...future.stdout <- NULL [15:31:50.402] } [15:31:50.402] ...future.result$conditions <- ...future.conditions [15:31:50.402] ...future.result$finished <- base::Sys.time() [15:31:50.402] ...future.result [15:31:50.402] } [15:31:50.408] assign_globals() ... [15:31:50.408] List of 5 [15:31:50.408] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:50.408] $ future.call.arguments :List of 1 [15:31:50.408] ..$ length: int 2 [15:31:50.408] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:50.408] $ ...future.elements_ii :List of 4 [15:31:50.408] ..$ c: chr "list" [15:31:50.408] ..$ c: chr "character" [15:31:50.408] ..$ b: chr "numeric" [15:31:50.408] ..$ a: chr "integer" [15:31:50.408] $ ...future.seeds_ii : NULL [15:31:50.408] $ ...future.globals.maxSize: NULL [15:31:50.408] - attr(*, "where")=List of 5 [15:31:50.408] ..$ ...future.FUN : [15:31:50.408] ..$ future.call.arguments : [15:31:50.408] ..$ ...future.elements_ii : [15:31:50.408] ..$ ...future.seeds_ii : [15:31:50.408] ..$ ...future.globals.maxSize: [15:31:50.408] - attr(*, "resolved")= logi FALSE [15:31:50.408] - attr(*, "total_size")= num 2240 [15:31:50.408] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:50.408] - attr(*, "already-done")= logi TRUE [15:31:50.419] - copied '...future.FUN' to environment [15:31:50.420] - copied 'future.call.arguments' to environment [15:31:50.420] - copied '...future.elements_ii' to environment [15:31:50.420] - copied '...future.seeds_ii' to environment [15:31:50.421] - copied '...future.globals.maxSize' to environment [15:31:50.421] assign_globals() ... done [15:31:50.422] plan(): Setting new future strategy stack: [15:31:50.422] List of future strategies: [15:31:50.422] 1. sequential: [15:31:50.422] - args: function (..., envir = parent.frame(), workers = "") [15:31:50.422] - tweaked: FALSE [15:31:50.422] - call: NULL [15:31:50.423] plan(): nbrOfWorkers() = 1 [15:31:50.425] plan(): Setting new future strategy stack: [15:31:50.425] List of future strategies: [15:31:50.425] 1. multisession: [15:31:50.425] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:50.425] - tweaked: FALSE [15:31:50.425] - call: plan(strategy) [15:31:50.429] plan(): nbrOfWorkers() = 1 [15:31:50.430] SequentialFuture started (and completed) [15:31:50.430] - Launch lazy future ... done [15:31:50.430] run() for 'SequentialFuture' ... done [15:31:50.431] Created future: [15:31:50.431] SequentialFuture: [15:31:50.431] Label: 'future_lapply-1' [15:31:50.431] Expression: [15:31:50.431] { [15:31:50.431] do.call(function(...) { [15:31:50.431] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:50.431] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:50.431] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:50.431] on.exit(options(oopts), add = TRUE) [15:31:50.431] } [15:31:50.431] { [15:31:50.431] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:50.431] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:50.431] ...future.FUN(...future.X_jj, ...) [15:31:50.431] }) [15:31:50.431] } [15:31:50.431] }, args = future.call.arguments) [15:31:50.431] } [15:31:50.431] Lazy evaluation: FALSE [15:31:50.431] Asynchronous evaluation: FALSE [15:31:50.431] Local evaluation: TRUE [15:31:50.431] Environment: R_GlobalEnv [15:31:50.431] Capture standard output: TRUE [15:31:50.431] Capture condition classes: 'condition' (excluding 'nothing') [15:31:50.431] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:50.431] Packages: [15:31:50.431] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:50.431] Resolved: TRUE [15:31:50.431] Value: 240 bytes of class 'list' [15:31:50.431] Early signaling: FALSE [15:31:50.431] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:50.431] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:50.433] Chunk #1 of 1 ... DONE [15:31:50.433] Launching 1 futures (chunks) ... DONE [15:31:50.434] Resolving 1 futures (chunks) ... [15:31:50.434] resolve() on list ... [15:31:50.434] recursive: 0 [15:31:50.435] length: 1 [15:31:50.435] [15:31:50.435] resolved() for 'SequentialFuture' ... [15:31:50.435] - state: 'finished' [15:31:50.436] - run: TRUE [15:31:50.436] - result: 'FutureResult' [15:31:50.436] resolved() for 'SequentialFuture' ... done [15:31:50.436] Future #1 [15:31:50.437] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:50.437] - nx: 1 [15:31:50.437] - relay: TRUE [15:31:50.438] - stdout: TRUE [15:31:50.438] - signal: TRUE [15:31:50.438] - resignal: FALSE [15:31:50.438] - force: TRUE [15:31:50.439] - relayed: [n=1] FALSE [15:31:50.439] - queued futures: [n=1] FALSE [15:31:50.439] - until=1 [15:31:50.439] - relaying element #1 [15:31:50.440] - relayed: [n=1] TRUE [15:31:50.440] - queued futures: [n=1] TRUE [15:31:50.440] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:50.441] length: 0 (resolved future 1) [15:31:50.441] Relaying remaining futures [15:31:50.441] signalConditionsASAP(NULL, pos=0) ... [15:31:50.442] - nx: 1 [15:31:50.442] - relay: TRUE [15:31:50.442] - stdout: TRUE [15:31:50.442] - signal: TRUE [15:31:50.443] - resignal: FALSE [15:31:50.443] - force: TRUE [15:31:50.443] - relayed: [n=1] TRUE [15:31:50.443] - queued futures: [n=1] TRUE - flush all [15:31:50.444] - relayed: [n=1] TRUE [15:31:50.444] - queued futures: [n=1] TRUE [15:31:50.444] signalConditionsASAP(NULL, pos=0) ... done [15:31:50.445] resolve() on list ... DONE [15:31:50.445] - Number of value chunks collected: 1 [15:31:50.445] Resolving 1 futures (chunks) ... DONE [15:31:50.446] Reducing values from 1 chunks ... [15:31:50.446] - Number of values collected after concatenation: 4 [15:31:50.446] - Number of values expected: 4 [15:31:50.447] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [15:31:50.447] Reducing values from 1 chunks ... DONE [15:31:50.447] 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 [15:31:50.452] future_lapply() ... [15:31:50.457] Number of chunks: 1 [15:31:50.457] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [15:31:50.458] getGlobalsAndPackagesXApply() ... [15:31:50.458] - future.globals: TRUE [15:31:50.458] getGlobalsAndPackages() ... [15:31:50.459] Searching for globals... [15:31:50.461] - globals found: [2] 'FUN', '.Internal' [15:31:50.461] Searching for globals ... DONE [15:31:50.462] Resolving globals: FALSE [15:31:50.463] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:50.463] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:50.464] - globals: [1] 'FUN' [15:31:50.464] [15:31:50.464] getGlobalsAndPackages() ... DONE [15:31:50.465] - globals found/used: [n=1] 'FUN' [15:31:50.465] - needed namespaces: [n=0] [15:31:50.465] Finding globals ... DONE [15:31:50.465] - use_args: TRUE [15:31:50.466] - Getting '...' globals ... [15:31:50.467] resolve() on list ... [15:31:50.467] recursive: 0 [15:31:50.467] length: 1 [15:31:50.467] elements: '...' [15:31:50.468] length: 0 (resolved future 1) [15:31:50.468] resolve() on list ... DONE [15:31:50.468] - '...' content: [n=1] 'length' [15:31:50.469] List of 1 [15:31:50.469] $ ...:List of 1 [15:31:50.469] ..$ length: int 2 [15:31:50.469] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:50.469] - attr(*, "where")=List of 1 [15:31:50.469] ..$ ...: [15:31:50.469] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:50.469] - attr(*, "resolved")= logi TRUE [15:31:50.469] - attr(*, "total_size")= num NA [15:31:50.475] - Getting '...' globals ... DONE [15:31:50.476] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:50.476] List of 2 [15:31:50.476] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:50.476] $ ... :List of 1 [15:31:50.476] ..$ length: int 2 [15:31:50.476] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:50.476] - attr(*, "where")=List of 2 [15:31:50.476] ..$ ...future.FUN: [15:31:50.476] ..$ ... : [15:31:50.476] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:50.476] - attr(*, "resolved")= logi FALSE [15:31:50.476] - attr(*, "total_size")= num 2240 [15:31:50.482] Packages to be attached in all futures: [n=0] [15:31:50.483] getGlobalsAndPackagesXApply() ... DONE [15:31:50.483] Number of futures (= number of chunks): 1 [15:31:50.483] Launching 1 futures (chunks) ... [15:31:50.484] Chunk #1 of 1 ... [15:31:50.484] - Finding globals in 'X' for chunk #1 ... [15:31:50.484] getGlobalsAndPackages() ... [15:31:50.484] Searching for globals... [15:31:50.485] [15:31:50.485] Searching for globals ... DONE [15:31:50.486] - globals: [0] [15:31:50.486] getGlobalsAndPackages() ... DONE [15:31:50.486] + additional globals found: [n=0] [15:31:50.486] + additional namespaces needed: [n=0] [15:31:50.487] - Finding globals in 'X' for chunk #1 ... DONE [15:31:50.487] - seeds: [15:31:50.487] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.487] getGlobalsAndPackages() ... [15:31:50.488] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.488] Resolving globals: FALSE [15:31:50.488] Tweak future expression to call with '...' arguments ... [15:31:50.489] { [15:31:50.489] do.call(function(...) { [15:31:50.489] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:50.489] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:50.489] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:50.489] on.exit(options(oopts), add = TRUE) [15:31:50.489] } [15:31:50.489] { [15:31:50.489] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:50.489] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:50.489] ...future.FUN(...future.X_jj, ...) [15:31:50.489] }) [15:31:50.489] } [15:31:50.489] }, args = future.call.arguments) [15:31:50.489] } [15:31:50.489] Tweak future expression to call with '...' arguments ... DONE [15:31:50.490] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.490] [15:31:50.491] getGlobalsAndPackages() ... DONE [15:31:50.491] run() for 'Future' ... [15:31:50.492] - state: 'created' [15:31:50.492] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:50.496] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:50.497] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:50.497] - Field: 'label' [15:31:50.497] - Field: 'local' [15:31:50.497] - Field: 'owner' [15:31:50.498] - Field: 'envir' [15:31:50.498] - Field: 'packages' [15:31:50.498] - Field: 'gc' [15:31:50.499] - Field: 'conditions' [15:31:50.499] - Field: 'expr' [15:31:50.500] - Field: 'uuid' [15:31:50.500] - Field: 'seed' [15:31:50.500] - Field: 'version' [15:31:50.501] - Field: 'result' [15:31:50.501] - Field: 'asynchronous' [15:31:50.501] - Field: 'calls' [15:31:50.501] - Field: 'globals' [15:31:50.502] - Field: 'stdout' [15:31:50.502] - Field: 'earlySignal' [15:31:50.502] - Field: 'lazy' [15:31:50.503] - Field: 'state' [15:31:50.503] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:50.503] - Launch lazy future ... [15:31:50.504] Packages needed by the future expression (n = 0): [15:31:50.504] Packages needed by future strategies (n = 0): [15:31:50.505] { [15:31:50.505] { [15:31:50.505] { [15:31:50.505] ...future.startTime <- base::Sys.time() [15:31:50.505] { [15:31:50.505] { [15:31:50.505] { [15:31:50.505] base::local({ [15:31:50.505] has_future <- base::requireNamespace("future", [15:31:50.505] quietly = TRUE) [15:31:50.505] if (has_future) { [15:31:50.505] ns <- base::getNamespace("future") [15:31:50.505] version <- ns[[".package"]][["version"]] [15:31:50.505] if (is.null(version)) [15:31:50.505] version <- utils::packageVersion("future") [15:31:50.505] } [15:31:50.505] else { [15:31:50.505] version <- NULL [15:31:50.505] } [15:31:50.505] if (!has_future || version < "1.8.0") { [15:31:50.505] info <- base::c(r_version = base::gsub("R version ", [15:31:50.505] "", base::R.version$version.string), [15:31:50.505] platform = base::sprintf("%s (%s-bit)", [15:31:50.505] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:50.505] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:50.505] "release", "version")], collapse = " "), [15:31:50.505] hostname = base::Sys.info()[["nodename"]]) [15:31:50.505] info <- base::sprintf("%s: %s", base::names(info), [15:31:50.505] info) [15:31:50.505] info <- base::paste(info, collapse = "; ") [15:31:50.505] if (!has_future) { [15:31:50.505] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:50.505] info) [15:31:50.505] } [15:31:50.505] else { [15:31:50.505] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:50.505] info, version) [15:31:50.505] } [15:31:50.505] base::stop(msg) [15:31:50.505] } [15:31:50.505] }) [15:31:50.505] } [15:31:50.505] ...future.strategy.old <- future::plan("list") [15:31:50.505] options(future.plan = NULL) [15:31:50.505] Sys.unsetenv("R_FUTURE_PLAN") [15:31:50.505] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:50.505] } [15:31:50.505] ...future.workdir <- getwd() [15:31:50.505] } [15:31:50.505] ...future.oldOptions <- base::as.list(base::.Options) [15:31:50.505] ...future.oldEnvVars <- base::Sys.getenv() [15:31:50.505] } [15:31:50.505] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:50.505] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:50.505] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:50.505] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:50.505] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:50.505] future.stdout.windows.reencode = NULL, width = 80L) [15:31:50.505] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:50.505] base::names(...future.oldOptions)) [15:31:50.505] } [15:31:50.505] if (FALSE) { [15:31:50.505] } [15:31:50.505] else { [15:31:50.505] if (TRUE) { [15:31:50.505] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:50.505] open = "w") [15:31:50.505] } [15:31:50.505] else { [15:31:50.505] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:50.505] windows = "NUL", "/dev/null"), open = "w") [15:31:50.505] } [15:31:50.505] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:50.505] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:50.505] base::sink(type = "output", split = FALSE) [15:31:50.505] base::close(...future.stdout) [15:31:50.505] }, add = TRUE) [15:31:50.505] } [15:31:50.505] ...future.frame <- base::sys.nframe() [15:31:50.505] ...future.conditions <- base::list() [15:31:50.505] ...future.rng <- base::globalenv()$.Random.seed [15:31:50.505] if (FALSE) { [15:31:50.505] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:50.505] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:50.505] } [15:31:50.505] ...future.result <- base::tryCatch({ [15:31:50.505] base::withCallingHandlers({ [15:31:50.505] ...future.value <- base::withVisible(base::local({ [15:31:50.505] do.call(function(...) { [15:31:50.505] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:50.505] if (!identical(...future.globals.maxSize.org, [15:31:50.505] ...future.globals.maxSize)) { [15:31:50.505] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:50.505] on.exit(options(oopts), add = TRUE) [15:31:50.505] } [15:31:50.505] { [15:31:50.505] lapply(seq_along(...future.elements_ii), [15:31:50.505] FUN = function(jj) { [15:31:50.505] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:50.505] ...future.FUN(...future.X_jj, ...) [15:31:50.505] }) [15:31:50.505] } [15:31:50.505] }, args = future.call.arguments) [15:31:50.505] })) [15:31:50.505] future::FutureResult(value = ...future.value$value, [15:31:50.505] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:50.505] ...future.rng), globalenv = if (FALSE) [15:31:50.505] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:50.505] ...future.globalenv.names)) [15:31:50.505] else NULL, started = ...future.startTime, version = "1.8") [15:31:50.505] }, condition = base::local({ [15:31:50.505] c <- base::c [15:31:50.505] inherits <- base::inherits [15:31:50.505] invokeRestart <- base::invokeRestart [15:31:50.505] length <- base::length [15:31:50.505] list <- base::list [15:31:50.505] seq.int <- base::seq.int [15:31:50.505] signalCondition <- base::signalCondition [15:31:50.505] sys.calls <- base::sys.calls [15:31:50.505] `[[` <- base::`[[` [15:31:50.505] `+` <- base::`+` [15:31:50.505] `<<-` <- base::`<<-` [15:31:50.505] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:50.505] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:50.505] 3L)] [15:31:50.505] } [15:31:50.505] function(cond) { [15:31:50.505] is_error <- inherits(cond, "error") [15:31:50.505] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:50.505] NULL) [15:31:50.505] if (is_error) { [15:31:50.505] sessionInformation <- function() { [15:31:50.505] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:50.505] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:50.505] search = base::search(), system = base::Sys.info()) [15:31:50.505] } [15:31:50.505] ...future.conditions[[length(...future.conditions) + [15:31:50.505] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:50.505] cond$call), session = sessionInformation(), [15:31:50.505] timestamp = base::Sys.time(), signaled = 0L) [15:31:50.505] signalCondition(cond) [15:31:50.505] } [15:31:50.505] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:50.505] "immediateCondition"))) { [15:31:50.505] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:50.505] ...future.conditions[[length(...future.conditions) + [15:31:50.505] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:50.505] if (TRUE && !signal) { [15:31:50.505] muffleCondition <- function (cond, pattern = "^muffle") [15:31:50.505] { [15:31:50.505] inherits <- base::inherits [15:31:50.505] invokeRestart <- base::invokeRestart [15:31:50.505] is.null <- base::is.null [15:31:50.505] muffled <- FALSE [15:31:50.505] if (inherits(cond, "message")) { [15:31:50.505] muffled <- grepl(pattern, "muffleMessage") [15:31:50.505] if (muffled) [15:31:50.505] invokeRestart("muffleMessage") [15:31:50.505] } [15:31:50.505] else if (inherits(cond, "warning")) { [15:31:50.505] muffled <- grepl(pattern, "muffleWarning") [15:31:50.505] if (muffled) [15:31:50.505] invokeRestart("muffleWarning") [15:31:50.505] } [15:31:50.505] else if (inherits(cond, "condition")) { [15:31:50.505] if (!is.null(pattern)) { [15:31:50.505] computeRestarts <- base::computeRestarts [15:31:50.505] grepl <- base::grepl [15:31:50.505] restarts <- computeRestarts(cond) [15:31:50.505] for (restart in restarts) { [15:31:50.505] name <- restart$name [15:31:50.505] if (is.null(name)) [15:31:50.505] next [15:31:50.505] if (!grepl(pattern, name)) [15:31:50.505] next [15:31:50.505] invokeRestart(restart) [15:31:50.505] muffled <- TRUE [15:31:50.505] break [15:31:50.505] } [15:31:50.505] } [15:31:50.505] } [15:31:50.505] invisible(muffled) [15:31:50.505] } [15:31:50.505] muffleCondition(cond, pattern = "^muffle") [15:31:50.505] } [15:31:50.505] } [15:31:50.505] else { [15:31:50.505] if (TRUE) { [15:31:50.505] muffleCondition <- function (cond, pattern = "^muffle") [15:31:50.505] { [15:31:50.505] inherits <- base::inherits [15:31:50.505] invokeRestart <- base::invokeRestart [15:31:50.505] is.null <- base::is.null [15:31:50.505] muffled <- FALSE [15:31:50.505] if (inherits(cond, "message")) { [15:31:50.505] muffled <- grepl(pattern, "muffleMessage") [15:31:50.505] if (muffled) [15:31:50.505] invokeRestart("muffleMessage") [15:31:50.505] } [15:31:50.505] else if (inherits(cond, "warning")) { [15:31:50.505] muffled <- grepl(pattern, "muffleWarning") [15:31:50.505] if (muffled) [15:31:50.505] invokeRestart("muffleWarning") [15:31:50.505] } [15:31:50.505] else if (inherits(cond, "condition")) { [15:31:50.505] if (!is.null(pattern)) { [15:31:50.505] computeRestarts <- base::computeRestarts [15:31:50.505] grepl <- base::grepl [15:31:50.505] restarts <- computeRestarts(cond) [15:31:50.505] for (restart in restarts) { [15:31:50.505] name <- restart$name [15:31:50.505] if (is.null(name)) [15:31:50.505] next [15:31:50.505] if (!grepl(pattern, name)) [15:31:50.505] next [15:31:50.505] invokeRestart(restart) [15:31:50.505] muffled <- TRUE [15:31:50.505] break [15:31:50.505] } [15:31:50.505] } [15:31:50.505] } [15:31:50.505] invisible(muffled) [15:31:50.505] } [15:31:50.505] muffleCondition(cond, pattern = "^muffle") [15:31:50.505] } [15:31:50.505] } [15:31:50.505] } [15:31:50.505] })) [15:31:50.505] }, error = function(ex) { [15:31:50.505] base::structure(base::list(value = NULL, visible = NULL, [15:31:50.505] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:50.505] ...future.rng), started = ...future.startTime, [15:31:50.505] finished = Sys.time(), session_uuid = NA_character_, [15:31:50.505] version = "1.8"), class = "FutureResult") [15:31:50.505] }, finally = { [15:31:50.505] if (!identical(...future.workdir, getwd())) [15:31:50.505] setwd(...future.workdir) [15:31:50.505] { [15:31:50.505] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:50.505] ...future.oldOptions$nwarnings <- NULL [15:31:50.505] } [15:31:50.505] base::options(...future.oldOptions) [15:31:50.505] if (.Platform$OS.type == "windows") { [15:31:50.505] old_names <- names(...future.oldEnvVars) [15:31:50.505] envs <- base::Sys.getenv() [15:31:50.505] names <- names(envs) [15:31:50.505] common <- intersect(names, old_names) [15:31:50.505] added <- setdiff(names, old_names) [15:31:50.505] removed <- setdiff(old_names, names) [15:31:50.505] changed <- common[...future.oldEnvVars[common] != [15:31:50.505] envs[common]] [15:31:50.505] NAMES <- toupper(changed) [15:31:50.505] args <- list() [15:31:50.505] for (kk in seq_along(NAMES)) { [15:31:50.505] name <- changed[[kk]] [15:31:50.505] NAME <- NAMES[[kk]] [15:31:50.505] if (name != NAME && is.element(NAME, old_names)) [15:31:50.505] next [15:31:50.505] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:50.505] } [15:31:50.505] NAMES <- toupper(added) [15:31:50.505] for (kk in seq_along(NAMES)) { [15:31:50.505] name <- added[[kk]] [15:31:50.505] NAME <- NAMES[[kk]] [15:31:50.505] if (name != NAME && is.element(NAME, old_names)) [15:31:50.505] next [15:31:50.505] args[[name]] <- "" [15:31:50.505] } [15:31:50.505] NAMES <- toupper(removed) [15:31:50.505] for (kk in seq_along(NAMES)) { [15:31:50.505] name <- removed[[kk]] [15:31:50.505] NAME <- NAMES[[kk]] [15:31:50.505] if (name != NAME && is.element(NAME, old_names)) [15:31:50.505] next [15:31:50.505] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:50.505] } [15:31:50.505] if (length(args) > 0) [15:31:50.505] base::do.call(base::Sys.setenv, args = args) [15:31:50.505] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:50.505] } [15:31:50.505] else { [15:31:50.505] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:50.505] } [15:31:50.505] { [15:31:50.505] if (base::length(...future.futureOptionsAdded) > [15:31:50.505] 0L) { [15:31:50.505] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:50.505] base::names(opts) <- ...future.futureOptionsAdded [15:31:50.505] base::options(opts) [15:31:50.505] } [15:31:50.505] { [15:31:50.505] { [15:31:50.505] NULL [15:31:50.505] RNGkind("Mersenne-Twister") [15:31:50.505] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:50.505] inherits = FALSE) [15:31:50.505] } [15:31:50.505] options(future.plan = NULL) [15:31:50.505] if (is.na(NA_character_)) [15:31:50.505] Sys.unsetenv("R_FUTURE_PLAN") [15:31:50.505] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:50.505] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:50.505] .init = FALSE) [15:31:50.505] } [15:31:50.505] } [15:31:50.505] } [15:31:50.505] }) [15:31:50.505] if (TRUE) { [15:31:50.505] base::sink(type = "output", split = FALSE) [15:31:50.505] if (TRUE) { [15:31:50.505] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:50.505] } [15:31:50.505] else { [15:31:50.505] ...future.result["stdout"] <- base::list(NULL) [15:31:50.505] } [15:31:50.505] base::close(...future.stdout) [15:31:50.505] ...future.stdout <- NULL [15:31:50.505] } [15:31:50.505] ...future.result$conditions <- ...future.conditions [15:31:50.505] ...future.result$finished <- base::Sys.time() [15:31:50.505] ...future.result [15:31:50.505] } [15:31:50.512] assign_globals() ... [15:31:50.512] List of 5 [15:31:50.512] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:50.512] $ future.call.arguments :List of 1 [15:31:50.512] ..$ length: int 2 [15:31:50.512] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:50.512] $ ...future.elements_ii :List of 4 [15:31:50.512] ..$ c: chr "list" [15:31:50.512] ..$ c: chr "character" [15:31:50.512] ..$ b: chr "numeric" [15:31:50.512] ..$ a: chr "integer" [15:31:50.512] $ ...future.seeds_ii : NULL [15:31:50.512] $ ...future.globals.maxSize: NULL [15:31:50.512] - attr(*, "where")=List of 5 [15:31:50.512] ..$ ...future.FUN : [15:31:50.512] ..$ future.call.arguments : [15:31:50.512] ..$ ...future.elements_ii : [15:31:50.512] ..$ ...future.seeds_ii : [15:31:50.512] ..$ ...future.globals.maxSize: [15:31:50.512] - attr(*, "resolved")= logi FALSE [15:31:50.512] - attr(*, "total_size")= num 2240 [15:31:50.512] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:50.512] - attr(*, "already-done")= logi TRUE [15:31:50.529] - copied '...future.FUN' to environment [15:31:50.529] - copied 'future.call.arguments' to environment [15:31:50.530] - copied '...future.elements_ii' to environment [15:31:50.530] - copied '...future.seeds_ii' to environment [15:31:50.530] - copied '...future.globals.maxSize' to environment [15:31:50.530] assign_globals() ... done [15:31:50.531] plan(): Setting new future strategy stack: [15:31:50.531] List of future strategies: [15:31:50.531] 1. sequential: [15:31:50.531] - args: function (..., envir = parent.frame(), workers = "") [15:31:50.531] - tweaked: FALSE [15:31:50.531] - call: NULL [15:31:50.532] plan(): nbrOfWorkers() = 1 [15:31:50.533] plan(): Setting new future strategy stack: [15:31:50.534] List of future strategies: [15:31:50.534] 1. multisession: [15:31:50.534] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:50.534] - tweaked: FALSE [15:31:50.534] - call: plan(strategy) [15:31:50.537] plan(): nbrOfWorkers() = 1 [15:31:50.537] SequentialFuture started (and completed) [15:31:50.537] - Launch lazy future ... done [15:31:50.537] run() for 'SequentialFuture' ... done [15:31:50.538] Created future: [15:31:50.538] SequentialFuture: [15:31:50.538] Label: 'future_lapply-1' [15:31:50.538] Expression: [15:31:50.538] { [15:31:50.538] do.call(function(...) { [15:31:50.538] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:50.538] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:50.538] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:50.538] on.exit(options(oopts), add = TRUE) [15:31:50.538] } [15:31:50.538] { [15:31:50.538] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:50.538] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:50.538] ...future.FUN(...future.X_jj, ...) [15:31:50.538] }) [15:31:50.538] } [15:31:50.538] }, args = future.call.arguments) [15:31:50.538] } [15:31:50.538] Lazy evaluation: FALSE [15:31:50.538] Asynchronous evaluation: FALSE [15:31:50.538] Local evaluation: TRUE [15:31:50.538] Environment: R_GlobalEnv [15:31:50.538] Capture standard output: TRUE [15:31:50.538] Capture condition classes: 'condition' (excluding 'nothing') [15:31:50.538] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:50.538] Packages: [15:31:50.538] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:50.538] Resolved: TRUE [15:31:50.538] Value: 240 bytes of class 'list' [15:31:50.538] Early signaling: FALSE [15:31:50.538] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:50.538] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:50.540] Chunk #1 of 1 ... DONE [15:31:50.540] Launching 1 futures (chunks) ... DONE [15:31:50.540] Resolving 1 futures (chunks) ... [15:31:50.540] resolve() on list ... [15:31:50.541] recursive: 0 [15:31:50.541] length: 1 [15:31:50.541] [15:31:50.541] resolved() for 'SequentialFuture' ... [15:31:50.542] - state: 'finished' [15:31:50.542] - run: TRUE [15:31:50.542] - result: 'FutureResult' [15:31:50.542] resolved() for 'SequentialFuture' ... done [15:31:50.543] Future #1 [15:31:50.543] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:50.543] - nx: 1 [15:31:50.543] - relay: TRUE [15:31:50.543] - stdout: TRUE [15:31:50.543] - signal: TRUE [15:31:50.544] - resignal: FALSE [15:31:50.544] - force: TRUE [15:31:50.544] - relayed: [n=1] FALSE [15:31:50.544] - queued futures: [n=1] FALSE [15:31:50.544] - until=1 [15:31:50.544] - relaying element #1 [15:31:50.545] - relayed: [n=1] TRUE [15:31:50.545] - queued futures: [n=1] TRUE [15:31:50.545] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:50.545] length: 0 (resolved future 1) [15:31:50.546] Relaying remaining futures [15:31:50.546] signalConditionsASAP(NULL, pos=0) ... [15:31:50.546] - nx: 1 [15:31:50.547] - relay: TRUE [15:31:50.548] - stdout: TRUE [15:31:50.548] - signal: TRUE [15:31:50.548] - resignal: FALSE [15:31:50.548] - force: TRUE [15:31:50.549] - relayed: [n=1] TRUE [15:31:50.549] - queued futures: [n=1] TRUE - flush all [15:31:50.549] - relayed: [n=1] TRUE [15:31:50.550] - queued futures: [n=1] TRUE [15:31:50.550] signalConditionsASAP(NULL, pos=0) ... done [15:31:50.550] resolve() on list ... DONE [15:31:50.551] - Number of value chunks collected: 1 [15:31:50.551] Resolving 1 futures (chunks) ... DONE [15:31:50.551] Reducing values from 1 chunks ... [15:31:50.551] - Number of values collected after concatenation: 4 [15:31:50.552] - Number of values expected: 4 [15:31:50.552] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [15:31:50.552] Reducing values from 1 chunks ... DONE [15:31:50.552] 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, ...) ... [15:31:50.557] future_lapply() ... [15:31:50.561] Number of chunks: 1 [15:31:50.562] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [15:31:50.562] getGlobalsAndPackagesXApply() ... [15:31:50.562] - future.globals: TRUE [15:31:50.563] getGlobalsAndPackages() ... [15:31:50.563] Searching for globals... [15:31:50.566] - globals found: [2] 'FUN', '.Internal' [15:31:50.566] Searching for globals ... DONE [15:31:50.567] Resolving globals: FALSE [15:31:50.567] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:50.568] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:50.569] - globals: [1] 'FUN' [15:31:50.569] [15:31:50.569] getGlobalsAndPackages() ... DONE [15:31:50.569] - globals found/used: [n=1] 'FUN' [15:31:50.570] - needed namespaces: [n=0] [15:31:50.570] Finding globals ... DONE [15:31:50.570] - use_args: TRUE [15:31:50.571] - Getting '...' globals ... [15:31:50.572] resolve() on list ... [15:31:50.572] recursive: 0 [15:31:50.572] length: 1 [15:31:50.572] elements: '...' [15:31:50.573] length: 0 (resolved future 1) [15:31:50.573] resolve() on list ... DONE [15:31:50.573] - '...' content: [n=1] 'length' [15:31:50.574] List of 1 [15:31:50.574] $ ...:List of 1 [15:31:50.574] ..$ length: int 2 [15:31:50.574] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:50.574] - attr(*, "where")=List of 1 [15:31:50.574] ..$ ...: [15:31:50.574] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:50.574] - attr(*, "resolved")= logi TRUE [15:31:50.574] - attr(*, "total_size")= num NA [15:31:50.578] - Getting '...' globals ... DONE [15:31:50.578] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:50.578] List of 2 [15:31:50.578] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:50.578] $ ... :List of 1 [15:31:50.578] ..$ length: int 2 [15:31:50.578] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:50.578] - attr(*, "where")=List of 2 [15:31:50.578] ..$ ...future.FUN: [15:31:50.578] ..$ ... : [15:31:50.578] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:50.578] - attr(*, "resolved")= logi FALSE [15:31:50.578] - attr(*, "total_size")= num 2240 [15:31:50.582] Packages to be attached in all futures: [n=0] [15:31:50.583] getGlobalsAndPackagesXApply() ... DONE [15:31:50.583] Number of futures (= number of chunks): 1 [15:31:50.583] Launching 1 futures (chunks) ... [15:31:50.583] Chunk #1 of 1 ... [15:31:50.583] - Finding globals in 'X' for chunk #1 ... [15:31:50.584] getGlobalsAndPackages() ... [15:31:50.584] Searching for globals... [15:31:50.584] [15:31:50.584] Searching for globals ... DONE [15:31:50.585] - globals: [0] [15:31:50.585] getGlobalsAndPackages() ... DONE [15:31:50.585] + additional globals found: [n=0] [15:31:50.585] + additional namespaces needed: [n=0] [15:31:50.585] - Finding globals in 'X' for chunk #1 ... DONE [15:31:50.585] - seeds: [15:31:50.586] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.586] getGlobalsAndPackages() ... [15:31:50.586] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.586] Resolving globals: FALSE [15:31:50.586] Tweak future expression to call with '...' arguments ... [15:31:50.587] { [15:31:50.587] do.call(function(...) { [15:31:50.587] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:50.587] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:50.587] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:50.587] on.exit(options(oopts), add = TRUE) [15:31:50.587] } [15:31:50.587] { [15:31:50.587] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:50.587] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:50.587] ...future.FUN(...future.X_jj, ...) [15:31:50.587] }) [15:31:50.587] } [15:31:50.587] }, args = future.call.arguments) [15:31:50.587] } [15:31:50.587] Tweak future expression to call with '...' arguments ... DONE [15:31:50.588] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.588] [15:31:50.588] getGlobalsAndPackages() ... DONE [15:31:50.588] run() for 'Future' ... [15:31:50.589] - state: 'created' [15:31:50.589] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:50.592] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:50.592] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:50.592] - Field: 'label' [15:31:50.592] - Field: 'local' [15:31:50.593] - Field: 'owner' [15:31:50.593] - Field: 'envir' [15:31:50.593] - Field: 'packages' [15:31:50.593] - Field: 'gc' [15:31:50.593] - Field: 'conditions' [15:31:50.594] - Field: 'expr' [15:31:50.594] - Field: 'uuid' [15:31:50.594] - Field: 'seed' [15:31:50.594] - Field: 'version' [15:31:50.594] - Field: 'result' [15:31:50.595] - Field: 'asynchronous' [15:31:50.595] - Field: 'calls' [15:31:50.595] - Field: 'globals' [15:31:50.595] - Field: 'stdout' [15:31:50.595] - Field: 'earlySignal' [15:31:50.595] - Field: 'lazy' [15:31:50.596] - Field: 'state' [15:31:50.596] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:50.596] - Launch lazy future ... [15:31:50.596] Packages needed by the future expression (n = 0): [15:31:50.597] Packages needed by future strategies (n = 0): [15:31:50.597] { [15:31:50.597] { [15:31:50.597] { [15:31:50.597] ...future.startTime <- base::Sys.time() [15:31:50.597] { [15:31:50.597] { [15:31:50.597] { [15:31:50.597] base::local({ [15:31:50.597] has_future <- base::requireNamespace("future", [15:31:50.597] quietly = TRUE) [15:31:50.597] if (has_future) { [15:31:50.597] ns <- base::getNamespace("future") [15:31:50.597] version <- ns[[".package"]][["version"]] [15:31:50.597] if (is.null(version)) [15:31:50.597] version <- utils::packageVersion("future") [15:31:50.597] } [15:31:50.597] else { [15:31:50.597] version <- NULL [15:31:50.597] } [15:31:50.597] if (!has_future || version < "1.8.0") { [15:31:50.597] info <- base::c(r_version = base::gsub("R version ", [15:31:50.597] "", base::R.version$version.string), [15:31:50.597] platform = base::sprintf("%s (%s-bit)", [15:31:50.597] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:50.597] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:50.597] "release", "version")], collapse = " "), [15:31:50.597] hostname = base::Sys.info()[["nodename"]]) [15:31:50.597] info <- base::sprintf("%s: %s", base::names(info), [15:31:50.597] info) [15:31:50.597] info <- base::paste(info, collapse = "; ") [15:31:50.597] if (!has_future) { [15:31:50.597] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:50.597] info) [15:31:50.597] } [15:31:50.597] else { [15:31:50.597] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:50.597] info, version) [15:31:50.597] } [15:31:50.597] base::stop(msg) [15:31:50.597] } [15:31:50.597] }) [15:31:50.597] } [15:31:50.597] ...future.strategy.old <- future::plan("list") [15:31:50.597] options(future.plan = NULL) [15:31:50.597] Sys.unsetenv("R_FUTURE_PLAN") [15:31:50.597] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:50.597] } [15:31:50.597] ...future.workdir <- getwd() [15:31:50.597] } [15:31:50.597] ...future.oldOptions <- base::as.list(base::.Options) [15:31:50.597] ...future.oldEnvVars <- base::Sys.getenv() [15:31:50.597] } [15:31:50.597] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:50.597] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:50.597] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:50.597] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:50.597] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:50.597] future.stdout.windows.reencode = NULL, width = 80L) [15:31:50.597] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:50.597] base::names(...future.oldOptions)) [15:31:50.597] } [15:31:50.597] if (FALSE) { [15:31:50.597] } [15:31:50.597] else { [15:31:50.597] if (TRUE) { [15:31:50.597] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:50.597] open = "w") [15:31:50.597] } [15:31:50.597] else { [15:31:50.597] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:50.597] windows = "NUL", "/dev/null"), open = "w") [15:31:50.597] } [15:31:50.597] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:50.597] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:50.597] base::sink(type = "output", split = FALSE) [15:31:50.597] base::close(...future.stdout) [15:31:50.597] }, add = TRUE) [15:31:50.597] } [15:31:50.597] ...future.frame <- base::sys.nframe() [15:31:50.597] ...future.conditions <- base::list() [15:31:50.597] ...future.rng <- base::globalenv()$.Random.seed [15:31:50.597] if (FALSE) { [15:31:50.597] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:50.597] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:50.597] } [15:31:50.597] ...future.result <- base::tryCatch({ [15:31:50.597] base::withCallingHandlers({ [15:31:50.597] ...future.value <- base::withVisible(base::local({ [15:31:50.597] do.call(function(...) { [15:31:50.597] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:50.597] if (!identical(...future.globals.maxSize.org, [15:31:50.597] ...future.globals.maxSize)) { [15:31:50.597] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:50.597] on.exit(options(oopts), add = TRUE) [15:31:50.597] } [15:31:50.597] { [15:31:50.597] lapply(seq_along(...future.elements_ii), [15:31:50.597] FUN = function(jj) { [15:31:50.597] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:50.597] ...future.FUN(...future.X_jj, ...) [15:31:50.597] }) [15:31:50.597] } [15:31:50.597] }, args = future.call.arguments) [15:31:50.597] })) [15:31:50.597] future::FutureResult(value = ...future.value$value, [15:31:50.597] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:50.597] ...future.rng), globalenv = if (FALSE) [15:31:50.597] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:50.597] ...future.globalenv.names)) [15:31:50.597] else NULL, started = ...future.startTime, version = "1.8") [15:31:50.597] }, condition = base::local({ [15:31:50.597] c <- base::c [15:31:50.597] inherits <- base::inherits [15:31:50.597] invokeRestart <- base::invokeRestart [15:31:50.597] length <- base::length [15:31:50.597] list <- base::list [15:31:50.597] seq.int <- base::seq.int [15:31:50.597] signalCondition <- base::signalCondition [15:31:50.597] sys.calls <- base::sys.calls [15:31:50.597] `[[` <- base::`[[` [15:31:50.597] `+` <- base::`+` [15:31:50.597] `<<-` <- base::`<<-` [15:31:50.597] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:50.597] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:50.597] 3L)] [15:31:50.597] } [15:31:50.597] function(cond) { [15:31:50.597] is_error <- inherits(cond, "error") [15:31:50.597] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:50.597] NULL) [15:31:50.597] if (is_error) { [15:31:50.597] sessionInformation <- function() { [15:31:50.597] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:50.597] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:50.597] search = base::search(), system = base::Sys.info()) [15:31:50.597] } [15:31:50.597] ...future.conditions[[length(...future.conditions) + [15:31:50.597] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:50.597] cond$call), session = sessionInformation(), [15:31:50.597] timestamp = base::Sys.time(), signaled = 0L) [15:31:50.597] signalCondition(cond) [15:31:50.597] } [15:31:50.597] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:50.597] "immediateCondition"))) { [15:31:50.597] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:50.597] ...future.conditions[[length(...future.conditions) + [15:31:50.597] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:50.597] if (TRUE && !signal) { [15:31:50.597] muffleCondition <- function (cond, pattern = "^muffle") [15:31:50.597] { [15:31:50.597] inherits <- base::inherits [15:31:50.597] invokeRestart <- base::invokeRestart [15:31:50.597] is.null <- base::is.null [15:31:50.597] muffled <- FALSE [15:31:50.597] if (inherits(cond, "message")) { [15:31:50.597] muffled <- grepl(pattern, "muffleMessage") [15:31:50.597] if (muffled) [15:31:50.597] invokeRestart("muffleMessage") [15:31:50.597] } [15:31:50.597] else if (inherits(cond, "warning")) { [15:31:50.597] muffled <- grepl(pattern, "muffleWarning") [15:31:50.597] if (muffled) [15:31:50.597] invokeRestart("muffleWarning") [15:31:50.597] } [15:31:50.597] else if (inherits(cond, "condition")) { [15:31:50.597] if (!is.null(pattern)) { [15:31:50.597] computeRestarts <- base::computeRestarts [15:31:50.597] grepl <- base::grepl [15:31:50.597] restarts <- computeRestarts(cond) [15:31:50.597] for (restart in restarts) { [15:31:50.597] name <- restart$name [15:31:50.597] if (is.null(name)) [15:31:50.597] next [15:31:50.597] if (!grepl(pattern, name)) [15:31:50.597] next [15:31:50.597] invokeRestart(restart) [15:31:50.597] muffled <- TRUE [15:31:50.597] break [15:31:50.597] } [15:31:50.597] } [15:31:50.597] } [15:31:50.597] invisible(muffled) [15:31:50.597] } [15:31:50.597] muffleCondition(cond, pattern = "^muffle") [15:31:50.597] } [15:31:50.597] } [15:31:50.597] else { [15:31:50.597] if (TRUE) { [15:31:50.597] muffleCondition <- function (cond, pattern = "^muffle") [15:31:50.597] { [15:31:50.597] inherits <- base::inherits [15:31:50.597] invokeRestart <- base::invokeRestart [15:31:50.597] is.null <- base::is.null [15:31:50.597] muffled <- FALSE [15:31:50.597] if (inherits(cond, "message")) { [15:31:50.597] muffled <- grepl(pattern, "muffleMessage") [15:31:50.597] if (muffled) [15:31:50.597] invokeRestart("muffleMessage") [15:31:50.597] } [15:31:50.597] else if (inherits(cond, "warning")) { [15:31:50.597] muffled <- grepl(pattern, "muffleWarning") [15:31:50.597] if (muffled) [15:31:50.597] invokeRestart("muffleWarning") [15:31:50.597] } [15:31:50.597] else if (inherits(cond, "condition")) { [15:31:50.597] if (!is.null(pattern)) { [15:31:50.597] computeRestarts <- base::computeRestarts [15:31:50.597] grepl <- base::grepl [15:31:50.597] restarts <- computeRestarts(cond) [15:31:50.597] for (restart in restarts) { [15:31:50.597] name <- restart$name [15:31:50.597] if (is.null(name)) [15:31:50.597] next [15:31:50.597] if (!grepl(pattern, name)) [15:31:50.597] next [15:31:50.597] invokeRestart(restart) [15:31:50.597] muffled <- TRUE [15:31:50.597] break [15:31:50.597] } [15:31:50.597] } [15:31:50.597] } [15:31:50.597] invisible(muffled) [15:31:50.597] } [15:31:50.597] muffleCondition(cond, pattern = "^muffle") [15:31:50.597] } [15:31:50.597] } [15:31:50.597] } [15:31:50.597] })) [15:31:50.597] }, error = function(ex) { [15:31:50.597] base::structure(base::list(value = NULL, visible = NULL, [15:31:50.597] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:50.597] ...future.rng), started = ...future.startTime, [15:31:50.597] finished = Sys.time(), session_uuid = NA_character_, [15:31:50.597] version = "1.8"), class = "FutureResult") [15:31:50.597] }, finally = { [15:31:50.597] if (!identical(...future.workdir, getwd())) [15:31:50.597] setwd(...future.workdir) [15:31:50.597] { [15:31:50.597] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:50.597] ...future.oldOptions$nwarnings <- NULL [15:31:50.597] } [15:31:50.597] base::options(...future.oldOptions) [15:31:50.597] if (.Platform$OS.type == "windows") { [15:31:50.597] old_names <- names(...future.oldEnvVars) [15:31:50.597] envs <- base::Sys.getenv() [15:31:50.597] names <- names(envs) [15:31:50.597] common <- intersect(names, old_names) [15:31:50.597] added <- setdiff(names, old_names) [15:31:50.597] removed <- setdiff(old_names, names) [15:31:50.597] changed <- common[...future.oldEnvVars[common] != [15:31:50.597] envs[common]] [15:31:50.597] NAMES <- toupper(changed) [15:31:50.597] args <- list() [15:31:50.597] for (kk in seq_along(NAMES)) { [15:31:50.597] name <- changed[[kk]] [15:31:50.597] NAME <- NAMES[[kk]] [15:31:50.597] if (name != NAME && is.element(NAME, old_names)) [15:31:50.597] next [15:31:50.597] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:50.597] } [15:31:50.597] NAMES <- toupper(added) [15:31:50.597] for (kk in seq_along(NAMES)) { [15:31:50.597] name <- added[[kk]] [15:31:50.597] NAME <- NAMES[[kk]] [15:31:50.597] if (name != NAME && is.element(NAME, old_names)) [15:31:50.597] next [15:31:50.597] args[[name]] <- "" [15:31:50.597] } [15:31:50.597] NAMES <- toupper(removed) [15:31:50.597] for (kk in seq_along(NAMES)) { [15:31:50.597] name <- removed[[kk]] [15:31:50.597] NAME <- NAMES[[kk]] [15:31:50.597] if (name != NAME && is.element(NAME, old_names)) [15:31:50.597] next [15:31:50.597] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:50.597] } [15:31:50.597] if (length(args) > 0) [15:31:50.597] base::do.call(base::Sys.setenv, args = args) [15:31:50.597] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:50.597] } [15:31:50.597] else { [15:31:50.597] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:50.597] } [15:31:50.597] { [15:31:50.597] if (base::length(...future.futureOptionsAdded) > [15:31:50.597] 0L) { [15:31:50.597] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:50.597] base::names(opts) <- ...future.futureOptionsAdded [15:31:50.597] base::options(opts) [15:31:50.597] } [15:31:50.597] { [15:31:50.597] { [15:31:50.597] NULL [15:31:50.597] RNGkind("Mersenne-Twister") [15:31:50.597] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:50.597] inherits = FALSE) [15:31:50.597] } [15:31:50.597] options(future.plan = NULL) [15:31:50.597] if (is.na(NA_character_)) [15:31:50.597] Sys.unsetenv("R_FUTURE_PLAN") [15:31:50.597] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:50.597] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:50.597] .init = FALSE) [15:31:50.597] } [15:31:50.597] } [15:31:50.597] } [15:31:50.597] }) [15:31:50.597] if (TRUE) { [15:31:50.597] base::sink(type = "output", split = FALSE) [15:31:50.597] if (TRUE) { [15:31:50.597] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:50.597] } [15:31:50.597] else { [15:31:50.597] ...future.result["stdout"] <- base::list(NULL) [15:31:50.597] } [15:31:50.597] base::close(...future.stdout) [15:31:50.597] ...future.stdout <- NULL [15:31:50.597] } [15:31:50.597] ...future.result$conditions <- ...future.conditions [15:31:50.597] ...future.result$finished <- base::Sys.time() [15:31:50.597] ...future.result [15:31:50.597] } [15:31:50.602] assign_globals() ... [15:31:50.602] List of 5 [15:31:50.602] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:50.602] $ future.call.arguments :List of 1 [15:31:50.602] ..$ length: int 2 [15:31:50.602] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:50.602] $ ...future.elements_ii :List of 4 [15:31:50.602] ..$ c: chr "list" [15:31:50.602] ..$ c: chr "character" [15:31:50.602] ..$ b: chr "numeric" [15:31:50.602] ..$ a: chr "integer" [15:31:50.602] $ ...future.seeds_ii : NULL [15:31:50.602] $ ...future.globals.maxSize: NULL [15:31:50.602] - attr(*, "where")=List of 5 [15:31:50.602] ..$ ...future.FUN : [15:31:50.602] ..$ future.call.arguments : [15:31:50.602] ..$ ...future.elements_ii : [15:31:50.602] ..$ ...future.seeds_ii : [15:31:50.602] ..$ ...future.globals.maxSize: [15:31:50.602] - attr(*, "resolved")= logi FALSE [15:31:50.602] - attr(*, "total_size")= num 2240 [15:31:50.602] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:50.602] - attr(*, "already-done")= logi TRUE [15:31:50.610] - copied '...future.FUN' to environment [15:31:50.610] - copied 'future.call.arguments' to environment [15:31:50.610] - copied '...future.elements_ii' to environment [15:31:50.610] - copied '...future.seeds_ii' to environment [15:31:50.611] - copied '...future.globals.maxSize' to environment [15:31:50.611] assign_globals() ... done [15:31:50.611] plan(): Setting new future strategy stack: [15:31:50.611] List of future strategies: [15:31:50.611] 1. sequential: [15:31:50.611] - args: function (..., envir = parent.frame(), workers = "") [15:31:50.611] - tweaked: FALSE [15:31:50.611] - call: NULL [15:31:50.612] plan(): nbrOfWorkers() = 1 [15:31:50.614] plan(): Setting new future strategy stack: [15:31:50.614] List of future strategies: [15:31:50.614] 1. multisession: [15:31:50.614] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:50.614] - tweaked: FALSE [15:31:50.614] - call: plan(strategy) [15:31:50.616] plan(): nbrOfWorkers() = 1 [15:31:50.617] SequentialFuture started (and completed) [15:31:50.617] - Launch lazy future ... done [15:31:50.617] run() for 'SequentialFuture' ... done [15:31:50.617] Created future: [15:31:50.617] SequentialFuture: [15:31:50.617] Label: 'future_lapply-1' [15:31:50.617] Expression: [15:31:50.617] { [15:31:50.617] do.call(function(...) { [15:31:50.617] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:50.617] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:50.617] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:50.617] on.exit(options(oopts), add = TRUE) [15:31:50.617] } [15:31:50.617] { [15:31:50.617] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:50.617] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:50.617] ...future.FUN(...future.X_jj, ...) [15:31:50.617] }) [15:31:50.617] } [15:31:50.617] }, args = future.call.arguments) [15:31:50.617] } [15:31:50.617] Lazy evaluation: FALSE [15:31:50.617] Asynchronous evaluation: FALSE [15:31:50.617] Local evaluation: TRUE [15:31:50.617] Environment: R_GlobalEnv [15:31:50.617] Capture standard output: TRUE [15:31:50.617] Capture condition classes: 'condition' (excluding 'nothing') [15:31:50.617] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:50.617] Packages: [15:31:50.617] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:50.617] Resolved: TRUE [15:31:50.617] Value: 240 bytes of class 'list' [15:31:50.617] Early signaling: FALSE [15:31:50.617] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:50.617] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:50.619] Chunk #1 of 1 ... DONE [15:31:50.619] Launching 1 futures (chunks) ... DONE [15:31:50.619] Resolving 1 futures (chunks) ... [15:31:50.620] resolve() on list ... [15:31:50.620] recursive: 0 [15:31:50.620] length: 1 [15:31:50.620] [15:31:50.620] resolved() for 'SequentialFuture' ... [15:31:50.621] - state: 'finished' [15:31:50.621] - run: TRUE [15:31:50.621] - result: 'FutureResult' [15:31:50.621] resolved() for 'SequentialFuture' ... done [15:31:50.621] Future #1 [15:31:50.621] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:50.622] - nx: 1 [15:31:50.622] - relay: TRUE [15:31:50.622] - stdout: TRUE [15:31:50.622] - signal: TRUE [15:31:50.622] - resignal: FALSE [15:31:50.622] - force: TRUE [15:31:50.623] - relayed: [n=1] FALSE [15:31:50.623] - queued futures: [n=1] FALSE [15:31:50.623] - until=1 [15:31:50.623] - relaying element #1 [15:31:50.623] - relayed: [n=1] TRUE [15:31:50.624] - queued futures: [n=1] TRUE [15:31:50.624] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:50.624] length: 0 (resolved future 1) [15:31:50.624] Relaying remaining futures [15:31:50.625] signalConditionsASAP(NULL, pos=0) ... [15:31:50.625] - nx: 1 [15:31:50.625] - relay: TRUE [15:31:50.625] - stdout: TRUE [15:31:50.626] - signal: TRUE [15:31:50.626] - resignal: FALSE [15:31:50.626] - force: TRUE [15:31:50.626] - relayed: [n=1] TRUE [15:31:50.626] - queued futures: [n=1] TRUE - flush all [15:31:50.627] - relayed: [n=1] TRUE [15:31:50.627] - queued futures: [n=1] TRUE [15:31:50.627] signalConditionsASAP(NULL, pos=0) ... done [15:31:50.628] resolve() on list ... DONE [15:31:50.628] - Number of value chunks collected: 1 [15:31:50.628] Resolving 1 futures (chunks) ... DONE [15:31:50.628] Reducing values from 1 chunks ... [15:31:50.629] - Number of values collected after concatenation: 4 [15:31:50.629] - Number of values expected: 4 [15:31:50.629] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [15:31:50.630] Reducing values from 1 chunks ... DONE [15:31:50.630] 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, ...) ... [15:31:50.634] future_lapply() ... [15:31:50.652] Number of chunks: 1 [15:31:50.652] getGlobalsAndPackagesXApply() ... [15:31:50.652] - future.globals: TRUE [15:31:50.653] getGlobalsAndPackages() ... [15:31:50.653] Searching for globals... [15:31:50.675] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [15:31:50.675] Searching for globals ... DONE [15:31:50.676] Resolving globals: FALSE [15:31:50.677] The total size of the 1 globals is 69.62 KiB (71288 bytes) [15:31:50.678] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 69.62 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (69.62 KiB of class 'function') [15:31:50.679] - globals: [1] 'FUN' [15:31:50.679] - packages: [1] 'future' [15:31:50.679] getGlobalsAndPackages() ... DONE [15:31:50.679] - globals found/used: [n=1] 'FUN' [15:31:50.680] - needed namespaces: [n=1] 'future' [15:31:50.680] Finding globals ... DONE [15:31:50.680] - use_args: TRUE [15:31:50.680] - Getting '...' globals ... [15:31:50.681] resolve() on list ... [15:31:50.681] recursive: 0 [15:31:50.682] length: 1 [15:31:50.682] elements: '...' [15:31:50.682] length: 0 (resolved future 1) [15:31:50.682] resolve() on list ... DONE [15:31:50.682] - '...' content: [n=2] 'collapse', 'maxHead' [15:31:50.683] List of 1 [15:31:50.683] $ ...:List of 2 [15:31:50.683] ..$ collapse: chr "; " [15:31:50.683] ..$ maxHead : int 3 [15:31:50.683] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:50.683] - attr(*, "where")=List of 1 [15:31:50.683] ..$ ...: [15:31:50.683] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:50.683] - attr(*, "resolved")= logi TRUE [15:31:50.683] - attr(*, "total_size")= num NA [15:31:50.687] - Getting '...' globals ... DONE [15:31:50.687] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:50.688] List of 2 [15:31:50.688] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:50.688] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:50.688] $ ... :List of 2 [15:31:50.688] ..$ collapse: chr "; " [15:31:50.688] ..$ maxHead : int 3 [15:31:50.688] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:50.688] - attr(*, "where")=List of 2 [15:31:50.688] ..$ ...future.FUN: [15:31:50.688] ..$ ... : [15:31:50.688] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:50.688] - attr(*, "resolved")= logi FALSE [15:31:50.688] - attr(*, "total_size")= num 71456 [15:31:50.693] Packages to be attached in all futures: [n=1] 'future' [15:31:50.694] getGlobalsAndPackagesXApply() ... DONE [15:31:50.694] Number of futures (= number of chunks): 1 [15:31:50.695] Launching 1 futures (chunks) ... [15:31:50.695] Chunk #1 of 1 ... [15:31:50.695] - Finding globals in 'X' for chunk #1 ... [15:31:50.695] getGlobalsAndPackages() ... [15:31:50.696] Searching for globals... [15:31:50.696] [15:31:50.697] Searching for globals ... DONE [15:31:50.697] - globals: [0] [15:31:50.697] getGlobalsAndPackages() ... DONE [15:31:50.697] + additional globals found: [n=0] [15:31:50.698] + additional namespaces needed: [n=0] [15:31:50.698] - Finding globals in 'X' for chunk #1 ... DONE [15:31:50.698] - seeds: [15:31:50.699] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.699] getGlobalsAndPackages() ... [15:31:50.699] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.700] Resolving globals: FALSE [15:31:50.700] Tweak future expression to call with '...' arguments ... [15:31:50.700] { [15:31:50.700] do.call(function(...) { [15:31:50.700] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:50.700] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:50.700] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:50.700] on.exit(options(oopts), add = TRUE) [15:31:50.700] } [15:31:50.700] { [15:31:50.700] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:50.700] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:50.700] ...future.FUN(...future.X_jj, ...) [15:31:50.700] }) [15:31:50.700] } [15:31:50.700] }, args = future.call.arguments) [15:31:50.700] } [15:31:50.701] Tweak future expression to call with '...' arguments ... DONE [15:31:50.701] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.702] - packages: [1] 'future' [15:31:50.702] getGlobalsAndPackages() ... DONE [15:31:50.702] run() for 'Future' ... [15:31:50.703] - state: 'created' [15:31:50.703] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:50.706] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:50.706] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:50.706] - Field: 'label' [15:31:50.707] - Field: 'local' [15:31:50.707] - Field: 'owner' [15:31:50.707] - Field: 'envir' [15:31:50.707] - Field: 'packages' [15:31:50.707] - Field: 'gc' [15:31:50.707] - Field: 'conditions' [15:31:50.708] - Field: 'expr' [15:31:50.708] - Field: 'uuid' [15:31:50.708] - Field: 'seed' [15:31:50.708] - Field: 'version' [15:31:50.708] - Field: 'result' [15:31:50.709] - Field: 'asynchronous' [15:31:50.709] - Field: 'calls' [15:31:50.709] - Field: 'globals' [15:31:50.709] - Field: 'stdout' [15:31:50.709] - Field: 'earlySignal' [15:31:50.709] - Field: 'lazy' [15:31:50.710] - Field: 'state' [15:31:50.710] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:50.710] - Launch lazy future ... [15:31:50.710] Packages needed by the future expression (n = 1): 'future' [15:31:50.710] Packages needed by future strategies (n = 0): [15:31:50.711] { [15:31:50.711] { [15:31:50.711] { [15:31:50.711] ...future.startTime <- base::Sys.time() [15:31:50.711] { [15:31:50.711] { [15:31:50.711] { [15:31:50.711] { [15:31:50.711] base::local({ [15:31:50.711] has_future <- base::requireNamespace("future", [15:31:50.711] quietly = TRUE) [15:31:50.711] if (has_future) { [15:31:50.711] ns <- base::getNamespace("future") [15:31:50.711] version <- ns[[".package"]][["version"]] [15:31:50.711] if (is.null(version)) [15:31:50.711] version <- utils::packageVersion("future") [15:31:50.711] } [15:31:50.711] else { [15:31:50.711] version <- NULL [15:31:50.711] } [15:31:50.711] if (!has_future || version < "1.8.0") { [15:31:50.711] info <- base::c(r_version = base::gsub("R version ", [15:31:50.711] "", base::R.version$version.string), [15:31:50.711] platform = base::sprintf("%s (%s-bit)", [15:31:50.711] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:50.711] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:50.711] "release", "version")], collapse = " "), [15:31:50.711] hostname = base::Sys.info()[["nodename"]]) [15:31:50.711] info <- base::sprintf("%s: %s", base::names(info), [15:31:50.711] info) [15:31:50.711] info <- base::paste(info, collapse = "; ") [15:31:50.711] if (!has_future) { [15:31:50.711] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:50.711] info) [15:31:50.711] } [15:31:50.711] else { [15:31:50.711] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:50.711] info, version) [15:31:50.711] } [15:31:50.711] base::stop(msg) [15:31:50.711] } [15:31:50.711] }) [15:31:50.711] } [15:31:50.711] base::local({ [15:31:50.711] for (pkg in "future") { [15:31:50.711] base::loadNamespace(pkg) [15:31:50.711] base::library(pkg, character.only = TRUE) [15:31:50.711] } [15:31:50.711] }) [15:31:50.711] } [15:31:50.711] ...future.strategy.old <- future::plan("list") [15:31:50.711] options(future.plan = NULL) [15:31:50.711] Sys.unsetenv("R_FUTURE_PLAN") [15:31:50.711] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:50.711] } [15:31:50.711] ...future.workdir <- getwd() [15:31:50.711] } [15:31:50.711] ...future.oldOptions <- base::as.list(base::.Options) [15:31:50.711] ...future.oldEnvVars <- base::Sys.getenv() [15:31:50.711] } [15:31:50.711] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:50.711] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:50.711] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:50.711] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:50.711] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:50.711] future.stdout.windows.reencode = NULL, width = 80L) [15:31:50.711] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:50.711] base::names(...future.oldOptions)) [15:31:50.711] } [15:31:50.711] if (FALSE) { [15:31:50.711] } [15:31:50.711] else { [15:31:50.711] if (TRUE) { [15:31:50.711] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:50.711] open = "w") [15:31:50.711] } [15:31:50.711] else { [15:31:50.711] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:50.711] windows = "NUL", "/dev/null"), open = "w") [15:31:50.711] } [15:31:50.711] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:50.711] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:50.711] base::sink(type = "output", split = FALSE) [15:31:50.711] base::close(...future.stdout) [15:31:50.711] }, add = TRUE) [15:31:50.711] } [15:31:50.711] ...future.frame <- base::sys.nframe() [15:31:50.711] ...future.conditions <- base::list() [15:31:50.711] ...future.rng <- base::globalenv()$.Random.seed [15:31:50.711] if (FALSE) { [15:31:50.711] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:50.711] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:50.711] } [15:31:50.711] ...future.result <- base::tryCatch({ [15:31:50.711] base::withCallingHandlers({ [15:31:50.711] ...future.value <- base::withVisible(base::local({ [15:31:50.711] do.call(function(...) { [15:31:50.711] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:50.711] if (!identical(...future.globals.maxSize.org, [15:31:50.711] ...future.globals.maxSize)) { [15:31:50.711] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:50.711] on.exit(options(oopts), add = TRUE) [15:31:50.711] } [15:31:50.711] { [15:31:50.711] lapply(seq_along(...future.elements_ii), [15:31:50.711] FUN = function(jj) { [15:31:50.711] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:50.711] ...future.FUN(...future.X_jj, ...) [15:31:50.711] }) [15:31:50.711] } [15:31:50.711] }, args = future.call.arguments) [15:31:50.711] })) [15:31:50.711] future::FutureResult(value = ...future.value$value, [15:31:50.711] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:50.711] ...future.rng), globalenv = if (FALSE) [15:31:50.711] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:50.711] ...future.globalenv.names)) [15:31:50.711] else NULL, started = ...future.startTime, version = "1.8") [15:31:50.711] }, condition = base::local({ [15:31:50.711] c <- base::c [15:31:50.711] inherits <- base::inherits [15:31:50.711] invokeRestart <- base::invokeRestart [15:31:50.711] length <- base::length [15:31:50.711] list <- base::list [15:31:50.711] seq.int <- base::seq.int [15:31:50.711] signalCondition <- base::signalCondition [15:31:50.711] sys.calls <- base::sys.calls [15:31:50.711] `[[` <- base::`[[` [15:31:50.711] `+` <- base::`+` [15:31:50.711] `<<-` <- base::`<<-` [15:31:50.711] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:50.711] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:50.711] 3L)] [15:31:50.711] } [15:31:50.711] function(cond) { [15:31:50.711] is_error <- inherits(cond, "error") [15:31:50.711] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:50.711] NULL) [15:31:50.711] if (is_error) { [15:31:50.711] sessionInformation <- function() { [15:31:50.711] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:50.711] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:50.711] search = base::search(), system = base::Sys.info()) [15:31:50.711] } [15:31:50.711] ...future.conditions[[length(...future.conditions) + [15:31:50.711] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:50.711] cond$call), session = sessionInformation(), [15:31:50.711] timestamp = base::Sys.time(), signaled = 0L) [15:31:50.711] signalCondition(cond) [15:31:50.711] } [15:31:50.711] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:50.711] "immediateCondition"))) { [15:31:50.711] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:50.711] ...future.conditions[[length(...future.conditions) + [15:31:50.711] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:50.711] if (TRUE && !signal) { [15:31:50.711] muffleCondition <- function (cond, pattern = "^muffle") [15:31:50.711] { [15:31:50.711] inherits <- base::inherits [15:31:50.711] invokeRestart <- base::invokeRestart [15:31:50.711] is.null <- base::is.null [15:31:50.711] muffled <- FALSE [15:31:50.711] if (inherits(cond, "message")) { [15:31:50.711] muffled <- grepl(pattern, "muffleMessage") [15:31:50.711] if (muffled) [15:31:50.711] invokeRestart("muffleMessage") [15:31:50.711] } [15:31:50.711] else if (inherits(cond, "warning")) { [15:31:50.711] muffled <- grepl(pattern, "muffleWarning") [15:31:50.711] if (muffled) [15:31:50.711] invokeRestart("muffleWarning") [15:31:50.711] } [15:31:50.711] else if (inherits(cond, "condition")) { [15:31:50.711] if (!is.null(pattern)) { [15:31:50.711] computeRestarts <- base::computeRestarts [15:31:50.711] grepl <- base::grepl [15:31:50.711] restarts <- computeRestarts(cond) [15:31:50.711] for (restart in restarts) { [15:31:50.711] name <- restart$name [15:31:50.711] if (is.null(name)) [15:31:50.711] next [15:31:50.711] if (!grepl(pattern, name)) [15:31:50.711] next [15:31:50.711] invokeRestart(restart) [15:31:50.711] muffled <- TRUE [15:31:50.711] break [15:31:50.711] } [15:31:50.711] } [15:31:50.711] } [15:31:50.711] invisible(muffled) [15:31:50.711] } [15:31:50.711] muffleCondition(cond, pattern = "^muffle") [15:31:50.711] } [15:31:50.711] } [15:31:50.711] else { [15:31:50.711] if (TRUE) { [15:31:50.711] muffleCondition <- function (cond, pattern = "^muffle") [15:31:50.711] { [15:31:50.711] inherits <- base::inherits [15:31:50.711] invokeRestart <- base::invokeRestart [15:31:50.711] is.null <- base::is.null [15:31:50.711] muffled <- FALSE [15:31:50.711] if (inherits(cond, "message")) { [15:31:50.711] muffled <- grepl(pattern, "muffleMessage") [15:31:50.711] if (muffled) [15:31:50.711] invokeRestart("muffleMessage") [15:31:50.711] } [15:31:50.711] else if (inherits(cond, "warning")) { [15:31:50.711] muffled <- grepl(pattern, "muffleWarning") [15:31:50.711] if (muffled) [15:31:50.711] invokeRestart("muffleWarning") [15:31:50.711] } [15:31:50.711] else if (inherits(cond, "condition")) { [15:31:50.711] if (!is.null(pattern)) { [15:31:50.711] computeRestarts <- base::computeRestarts [15:31:50.711] grepl <- base::grepl [15:31:50.711] restarts <- computeRestarts(cond) [15:31:50.711] for (restart in restarts) { [15:31:50.711] name <- restart$name [15:31:50.711] if (is.null(name)) [15:31:50.711] next [15:31:50.711] if (!grepl(pattern, name)) [15:31:50.711] next [15:31:50.711] invokeRestart(restart) [15:31:50.711] muffled <- TRUE [15:31:50.711] break [15:31:50.711] } [15:31:50.711] } [15:31:50.711] } [15:31:50.711] invisible(muffled) [15:31:50.711] } [15:31:50.711] muffleCondition(cond, pattern = "^muffle") [15:31:50.711] } [15:31:50.711] } [15:31:50.711] } [15:31:50.711] })) [15:31:50.711] }, error = function(ex) { [15:31:50.711] base::structure(base::list(value = NULL, visible = NULL, [15:31:50.711] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:50.711] ...future.rng), started = ...future.startTime, [15:31:50.711] finished = Sys.time(), session_uuid = NA_character_, [15:31:50.711] version = "1.8"), class = "FutureResult") [15:31:50.711] }, finally = { [15:31:50.711] if (!identical(...future.workdir, getwd())) [15:31:50.711] setwd(...future.workdir) [15:31:50.711] { [15:31:50.711] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:50.711] ...future.oldOptions$nwarnings <- NULL [15:31:50.711] } [15:31:50.711] base::options(...future.oldOptions) [15:31:50.711] if (.Platform$OS.type == "windows") { [15:31:50.711] old_names <- names(...future.oldEnvVars) [15:31:50.711] envs <- base::Sys.getenv() [15:31:50.711] names <- names(envs) [15:31:50.711] common <- intersect(names, old_names) [15:31:50.711] added <- setdiff(names, old_names) [15:31:50.711] removed <- setdiff(old_names, names) [15:31:50.711] changed <- common[...future.oldEnvVars[common] != [15:31:50.711] envs[common]] [15:31:50.711] NAMES <- toupper(changed) [15:31:50.711] args <- list() [15:31:50.711] for (kk in seq_along(NAMES)) { [15:31:50.711] name <- changed[[kk]] [15:31:50.711] NAME <- NAMES[[kk]] [15:31:50.711] if (name != NAME && is.element(NAME, old_names)) [15:31:50.711] next [15:31:50.711] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:50.711] } [15:31:50.711] NAMES <- toupper(added) [15:31:50.711] for (kk in seq_along(NAMES)) { [15:31:50.711] name <- added[[kk]] [15:31:50.711] NAME <- NAMES[[kk]] [15:31:50.711] if (name != NAME && is.element(NAME, old_names)) [15:31:50.711] next [15:31:50.711] args[[name]] <- "" [15:31:50.711] } [15:31:50.711] NAMES <- toupper(removed) [15:31:50.711] for (kk in seq_along(NAMES)) { [15:31:50.711] name <- removed[[kk]] [15:31:50.711] NAME <- NAMES[[kk]] [15:31:50.711] if (name != NAME && is.element(NAME, old_names)) [15:31:50.711] next [15:31:50.711] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:50.711] } [15:31:50.711] if (length(args) > 0) [15:31:50.711] base::do.call(base::Sys.setenv, args = args) [15:31:50.711] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:50.711] } [15:31:50.711] else { [15:31:50.711] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:50.711] } [15:31:50.711] { [15:31:50.711] if (base::length(...future.futureOptionsAdded) > [15:31:50.711] 0L) { [15:31:50.711] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:50.711] base::names(opts) <- ...future.futureOptionsAdded [15:31:50.711] base::options(opts) [15:31:50.711] } [15:31:50.711] { [15:31:50.711] { [15:31:50.711] NULL [15:31:50.711] RNGkind("Mersenne-Twister") [15:31:50.711] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:50.711] inherits = FALSE) [15:31:50.711] } [15:31:50.711] options(future.plan = NULL) [15:31:50.711] if (is.na(NA_character_)) [15:31:50.711] Sys.unsetenv("R_FUTURE_PLAN") [15:31:50.711] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:50.711] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:50.711] .init = FALSE) [15:31:50.711] } [15:31:50.711] } [15:31:50.711] } [15:31:50.711] }) [15:31:50.711] if (TRUE) { [15:31:50.711] base::sink(type = "output", split = FALSE) [15:31:50.711] if (TRUE) { [15:31:50.711] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:50.711] } [15:31:50.711] else { [15:31:50.711] ...future.result["stdout"] <- base::list(NULL) [15:31:50.711] } [15:31:50.711] base::close(...future.stdout) [15:31:50.711] ...future.stdout <- NULL [15:31:50.711] } [15:31:50.711] ...future.result$conditions <- ...future.conditions [15:31:50.711] ...future.result$finished <- base::Sys.time() [15:31:50.711] ...future.result [15:31:50.711] } [15:31:50.715] assign_globals() ... [15:31:50.716] List of 5 [15:31:50.716] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:50.716] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:50.716] $ future.call.arguments :List of 2 [15:31:50.716] ..$ collapse: chr "; " [15:31:50.716] ..$ maxHead : int 3 [15:31:50.716] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:50.716] $ ...future.elements_ii :List of 1 [15:31:50.716] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [15:31:50.716] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [15:31:50.716] $ ...future.seeds_ii : NULL [15:31:50.716] $ ...future.globals.maxSize: NULL [15:31:50.716] - attr(*, "where")=List of 5 [15:31:50.716] ..$ ...future.FUN : [15:31:50.716] ..$ future.call.arguments : [15:31:50.716] ..$ ...future.elements_ii : [15:31:50.716] ..$ ...future.seeds_ii : [15:31:50.716] ..$ ...future.globals.maxSize: [15:31:50.716] - attr(*, "resolved")= logi FALSE [15:31:50.716] - attr(*, "total_size")= num 71456 [15:31:50.716] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:50.716] - attr(*, "already-done")= logi TRUE [15:31:50.724] - copied '...future.FUN' to environment [15:31:50.724] - copied 'future.call.arguments' to environment [15:31:50.724] - copied '...future.elements_ii' to environment [15:31:50.725] - copied '...future.seeds_ii' to environment [15:31:50.725] - copied '...future.globals.maxSize' to environment [15:31:50.725] assign_globals() ... done [15:31:50.726] plan(): Setting new future strategy stack: [15:31:50.726] List of future strategies: [15:31:50.726] 1. sequential: [15:31:50.726] - args: function (..., envir = parent.frame(), workers = "") [15:31:50.726] - tweaked: FALSE [15:31:50.726] - call: NULL [15:31:50.727] plan(): nbrOfWorkers() = 1 [15:31:50.728] plan(): Setting new future strategy stack: [15:31:50.728] List of future strategies: [15:31:50.728] 1. multisession: [15:31:50.728] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:50.728] - tweaked: FALSE [15:31:50.728] - call: plan(strategy) [15:31:50.731] plan(): nbrOfWorkers() = 1 [15:31:50.731] SequentialFuture started (and completed) [15:31:50.731] - Launch lazy future ... done [15:31:50.732] run() for 'SequentialFuture' ... done [15:31:50.732] Created future: [15:31:50.732] SequentialFuture: [15:31:50.732] Label: 'future_lapply-1' [15:31:50.732] Expression: [15:31:50.732] { [15:31:50.732] do.call(function(...) { [15:31:50.732] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:50.732] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:50.732] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:50.732] on.exit(options(oopts), add = TRUE) [15:31:50.732] } [15:31:50.732] { [15:31:50.732] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:50.732] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:50.732] ...future.FUN(...future.X_jj, ...) [15:31:50.732] }) [15:31:50.732] } [15:31:50.732] }, args = future.call.arguments) [15:31:50.732] } [15:31:50.732] Lazy evaluation: FALSE [15:31:50.732] Asynchronous evaluation: FALSE [15:31:50.732] Local evaluation: TRUE [15:31:50.732] Environment: R_GlobalEnv [15:31:50.732] Capture standard output: TRUE [15:31:50.732] Capture condition classes: 'condition' (excluding 'nothing') [15:31:50.732] Globals: 5 objects totaling 82.61 KiB (function '...future.FUN' of 69.62 KiB, DotDotDotList 'future.call.arguments' of 168 bytes, list '...future.elements_ii' of 12.83 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:50.732] Packages: 1 packages ('future') [15:31:50.732] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:50.732] Resolved: TRUE [15:31:50.732] Value: 136 bytes of class 'list' [15:31:50.732] Early signaling: FALSE [15:31:50.732] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:50.732] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:50.734] Chunk #1 of 1 ... DONE [15:31:50.734] Launching 1 futures (chunks) ... DONE [15:31:50.734] Resolving 1 futures (chunks) ... [15:31:50.734] resolve() on list ... [15:31:50.734] recursive: 0 [15:31:50.735] length: 1 [15:31:50.735] [15:31:50.735] resolved() for 'SequentialFuture' ... [15:31:50.735] - state: 'finished' [15:31:50.736] - run: TRUE [15:31:50.736] - result: 'FutureResult' [15:31:50.736] resolved() for 'SequentialFuture' ... done [15:31:50.736] Future #1 [15:31:50.737] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:50.737] - nx: 1 [15:31:50.737] - relay: TRUE [15:31:50.737] - stdout: TRUE [15:31:50.738] - signal: TRUE [15:31:50.738] - resignal: FALSE [15:31:50.738] - force: TRUE [15:31:50.738] - relayed: [n=1] FALSE [15:31:50.738] - queued futures: [n=1] FALSE [15:31:50.739] - until=1 [15:31:50.739] - relaying element #1 [15:31:50.739] - relayed: [n=1] TRUE [15:31:50.739] - queued futures: [n=1] TRUE [15:31:50.740] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:50.740] length: 0 (resolved future 1) [15:31:50.740] Relaying remaining futures [15:31:50.740] signalConditionsASAP(NULL, pos=0) ... [15:31:50.741] - nx: 1 [15:31:50.741] - relay: TRUE [15:31:50.741] - stdout: TRUE [15:31:50.741] - signal: TRUE [15:31:50.741] - resignal: FALSE [15:31:50.742] - force: TRUE [15:31:50.742] - relayed: [n=1] TRUE [15:31:50.742] - queued futures: [n=1] TRUE - flush all [15:31:50.742] - relayed: [n=1] TRUE [15:31:50.743] - queued futures: [n=1] TRUE [15:31:50.743] signalConditionsASAP(NULL, pos=0) ... done [15:31:50.743] resolve() on list ... DONE [15:31:50.743] - Number of value chunks collected: 1 [15:31:50.744] Resolving 1 futures (chunks) ... DONE [15:31:50.744] Reducing values from 1 chunks ... [15:31:50.744] - Number of values collected after concatenation: 1 [15:31:50.744] - Number of values expected: 1 [15:31:50.744] Reducing values from 1 chunks ... DONE [15:31:50.745] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [15:31:50.746] future_lapply() ... [15:31:50.751] Number of chunks: 1 [15:31:50.751] Index remapping (attribute 'ordering'): [n = 2] 2, 1 [15:31:50.751] getGlobalsAndPackagesXApply() ... [15:31:50.752] - future.globals: TRUE [15:31:50.752] getGlobalsAndPackages() ... [15:31:50.752] Searching for globals... [15:31:50.754] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [15:31:50.755] Searching for globals ... DONE [15:31:50.755] Resolving globals: FALSE [15:31:50.756] The total size of the 1 globals is 4.85 KiB (4968 bytes) [15:31:50.757] The total size of the 1 globals exported for future expression ('FUN()') is 4.85 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (4.85 KiB of class 'function') [15:31:50.757] - globals: [1] 'FUN' [15:31:50.757] - packages: [1] 'listenv' [15:31:50.757] getGlobalsAndPackages() ... DONE [15:31:50.758] - globals found/used: [n=1] 'FUN' [15:31:50.758] - needed namespaces: [n=1] 'listenv' [15:31:50.758] Finding globals ... DONE [15:31:50.758] - use_args: TRUE [15:31:50.759] - Getting '...' globals ... [15:31:50.759] resolve() on list ... [15:31:50.760] recursive: 0 [15:31:50.760] length: 1 [15:31:50.760] elements: '...' [15:31:50.760] length: 0 (resolved future 1) [15:31:50.761] resolve() on list ... DONE [15:31:50.761] - '...' content: [n=0] [15:31:50.761] List of 1 [15:31:50.761] $ ...: list() [15:31:50.761] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:50.761] - attr(*, "where")=List of 1 [15:31:50.761] ..$ ...: [15:31:50.761] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:50.761] - attr(*, "resolved")= logi TRUE [15:31:50.761] - attr(*, "total_size")= num NA [15:31:50.766] - Getting '...' globals ... DONE [15:31:50.766] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:50.767] List of 2 [15:31:50.767] $ ...future.FUN:function (x, ...) [15:31:50.767] $ ... : list() [15:31:50.767] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:50.767] - attr(*, "where")=List of 2 [15:31:50.767] ..$ ...future.FUN: [15:31:50.767] ..$ ... : [15:31:50.767] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:50.767] - attr(*, "resolved")= logi FALSE [15:31:50.767] - attr(*, "total_size")= num 4968 [15:31:50.771] Packages to be attached in all futures: [n=1] 'listenv' [15:31:50.772] getGlobalsAndPackagesXApply() ... DONE [15:31:50.772] Number of futures (= number of chunks): 1 [15:31:50.772] Launching 1 futures (chunks) ... [15:31:50.772] Chunk #1 of 1 ... [15:31:50.773] - Finding globals in 'X' for chunk #1 ... [15:31:50.773] getGlobalsAndPackages() ... [15:31:50.773] Searching for globals... [15:31:50.774] [15:31:50.775] Searching for globals ... DONE [15:31:50.775] - globals: [0] [15:31:50.775] getGlobalsAndPackages() ... DONE [15:31:50.775] + additional globals found: [n=0] [15:31:50.776] + additional namespaces needed: [n=0] [15:31:50.776] - Finding globals in 'X' for chunk #1 ... DONE [15:31:50.776] - seeds: [15:31:50.776] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.777] getGlobalsAndPackages() ... [15:31:50.777] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.777] Resolving globals: FALSE [15:31:50.777] Tweak future expression to call with '...' arguments ... [15:31:50.778] { [15:31:50.778] do.call(function(...) { [15:31:50.778] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:50.778] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:50.778] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:50.778] on.exit(options(oopts), add = TRUE) [15:31:50.778] } [15:31:50.778] { [15:31:50.778] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:50.778] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:50.778] ...future.FUN(...future.X_jj, ...) [15:31:50.778] }) [15:31:50.778] } [15:31:50.778] }, args = future.call.arguments) [15:31:50.778] } [15:31:50.778] Tweak future expression to call with '...' arguments ... DONE [15:31:50.779] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.779] - packages: [1] 'listenv' [15:31:50.780] getGlobalsAndPackages() ... DONE [15:31:50.780] run() for 'Future' ... [15:31:50.781] - state: 'created' [15:31:50.781] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:50.785] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:50.785] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:50.785] - Field: 'label' [15:31:50.785] - Field: 'local' [15:31:50.786] - Field: 'owner' [15:31:50.786] - Field: 'envir' [15:31:50.786] - Field: 'packages' [15:31:50.787] - Field: 'gc' [15:31:50.787] - Field: 'conditions' [15:31:50.787] - Field: 'expr' [15:31:50.787] - Field: 'uuid' [15:31:50.788] - Field: 'seed' [15:31:50.788] - Field: 'version' [15:31:50.788] - Field: 'result' [15:31:50.788] - Field: 'asynchronous' [15:31:50.789] - Field: 'calls' [15:31:50.789] - Field: 'globals' [15:31:50.789] - Field: 'stdout' [15:31:50.789] - Field: 'earlySignal' [15:31:50.790] - Field: 'lazy' [15:31:50.790] - Field: 'state' [15:31:50.790] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:50.790] - Launch lazy future ... [15:31:50.791] Packages needed by the future expression (n = 1): 'listenv' [15:31:50.791] Packages needed by future strategies (n = 0): [15:31:50.792] { [15:31:50.792] { [15:31:50.792] { [15:31:50.792] ...future.startTime <- base::Sys.time() [15:31:50.792] { [15:31:50.792] { [15:31:50.792] { [15:31:50.792] { [15:31:50.792] base::local({ [15:31:50.792] has_future <- base::requireNamespace("future", [15:31:50.792] quietly = TRUE) [15:31:50.792] if (has_future) { [15:31:50.792] ns <- base::getNamespace("future") [15:31:50.792] version <- ns[[".package"]][["version"]] [15:31:50.792] if (is.null(version)) [15:31:50.792] version <- utils::packageVersion("future") [15:31:50.792] } [15:31:50.792] else { [15:31:50.792] version <- NULL [15:31:50.792] } [15:31:50.792] if (!has_future || version < "1.8.0") { [15:31:50.792] info <- base::c(r_version = base::gsub("R version ", [15:31:50.792] "", base::R.version$version.string), [15:31:50.792] platform = base::sprintf("%s (%s-bit)", [15:31:50.792] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:50.792] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:50.792] "release", "version")], collapse = " "), [15:31:50.792] hostname = base::Sys.info()[["nodename"]]) [15:31:50.792] info <- base::sprintf("%s: %s", base::names(info), [15:31:50.792] info) [15:31:50.792] info <- base::paste(info, collapse = "; ") [15:31:50.792] if (!has_future) { [15:31:50.792] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:50.792] info) [15:31:50.792] } [15:31:50.792] else { [15:31:50.792] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:50.792] info, version) [15:31:50.792] } [15:31:50.792] base::stop(msg) [15:31:50.792] } [15:31:50.792] }) [15:31:50.792] } [15:31:50.792] base::local({ [15:31:50.792] for (pkg in "listenv") { [15:31:50.792] base::loadNamespace(pkg) [15:31:50.792] base::library(pkg, character.only = TRUE) [15:31:50.792] } [15:31:50.792] }) [15:31:50.792] } [15:31:50.792] ...future.strategy.old <- future::plan("list") [15:31:50.792] options(future.plan = NULL) [15:31:50.792] Sys.unsetenv("R_FUTURE_PLAN") [15:31:50.792] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:50.792] } [15:31:50.792] ...future.workdir <- getwd() [15:31:50.792] } [15:31:50.792] ...future.oldOptions <- base::as.list(base::.Options) [15:31:50.792] ...future.oldEnvVars <- base::Sys.getenv() [15:31:50.792] } [15:31:50.792] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:50.792] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:50.792] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:50.792] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:50.792] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:50.792] future.stdout.windows.reencode = NULL, width = 80L) [15:31:50.792] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:50.792] base::names(...future.oldOptions)) [15:31:50.792] } [15:31:50.792] if (FALSE) { [15:31:50.792] } [15:31:50.792] else { [15:31:50.792] if (TRUE) { [15:31:50.792] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:50.792] open = "w") [15:31:50.792] } [15:31:50.792] else { [15:31:50.792] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:50.792] windows = "NUL", "/dev/null"), open = "w") [15:31:50.792] } [15:31:50.792] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:50.792] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:50.792] base::sink(type = "output", split = FALSE) [15:31:50.792] base::close(...future.stdout) [15:31:50.792] }, add = TRUE) [15:31:50.792] } [15:31:50.792] ...future.frame <- base::sys.nframe() [15:31:50.792] ...future.conditions <- base::list() [15:31:50.792] ...future.rng <- base::globalenv()$.Random.seed [15:31:50.792] if (FALSE) { [15:31:50.792] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:50.792] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:50.792] } [15:31:50.792] ...future.result <- base::tryCatch({ [15:31:50.792] base::withCallingHandlers({ [15:31:50.792] ...future.value <- base::withVisible(base::local({ [15:31:50.792] do.call(function(...) { [15:31:50.792] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:50.792] if (!identical(...future.globals.maxSize.org, [15:31:50.792] ...future.globals.maxSize)) { [15:31:50.792] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:50.792] on.exit(options(oopts), add = TRUE) [15:31:50.792] } [15:31:50.792] { [15:31:50.792] lapply(seq_along(...future.elements_ii), [15:31:50.792] FUN = function(jj) { [15:31:50.792] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:50.792] ...future.FUN(...future.X_jj, ...) [15:31:50.792] }) [15:31:50.792] } [15:31:50.792] }, args = future.call.arguments) [15:31:50.792] })) [15:31:50.792] future::FutureResult(value = ...future.value$value, [15:31:50.792] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:50.792] ...future.rng), globalenv = if (FALSE) [15:31:50.792] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:50.792] ...future.globalenv.names)) [15:31:50.792] else NULL, started = ...future.startTime, version = "1.8") [15:31:50.792] }, condition = base::local({ [15:31:50.792] c <- base::c [15:31:50.792] inherits <- base::inherits [15:31:50.792] invokeRestart <- base::invokeRestart [15:31:50.792] length <- base::length [15:31:50.792] list <- base::list [15:31:50.792] seq.int <- base::seq.int [15:31:50.792] signalCondition <- base::signalCondition [15:31:50.792] sys.calls <- base::sys.calls [15:31:50.792] `[[` <- base::`[[` [15:31:50.792] `+` <- base::`+` [15:31:50.792] `<<-` <- base::`<<-` [15:31:50.792] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:50.792] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:50.792] 3L)] [15:31:50.792] } [15:31:50.792] function(cond) { [15:31:50.792] is_error <- inherits(cond, "error") [15:31:50.792] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:50.792] NULL) [15:31:50.792] if (is_error) { [15:31:50.792] sessionInformation <- function() { [15:31:50.792] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:50.792] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:50.792] search = base::search(), system = base::Sys.info()) [15:31:50.792] } [15:31:50.792] ...future.conditions[[length(...future.conditions) + [15:31:50.792] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:50.792] cond$call), session = sessionInformation(), [15:31:50.792] timestamp = base::Sys.time(), signaled = 0L) [15:31:50.792] signalCondition(cond) [15:31:50.792] } [15:31:50.792] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:50.792] "immediateCondition"))) { [15:31:50.792] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:50.792] ...future.conditions[[length(...future.conditions) + [15:31:50.792] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:50.792] if (TRUE && !signal) { [15:31:50.792] muffleCondition <- function (cond, pattern = "^muffle") [15:31:50.792] { [15:31:50.792] inherits <- base::inherits [15:31:50.792] invokeRestart <- base::invokeRestart [15:31:50.792] is.null <- base::is.null [15:31:50.792] muffled <- FALSE [15:31:50.792] if (inherits(cond, "message")) { [15:31:50.792] muffled <- grepl(pattern, "muffleMessage") [15:31:50.792] if (muffled) [15:31:50.792] invokeRestart("muffleMessage") [15:31:50.792] } [15:31:50.792] else if (inherits(cond, "warning")) { [15:31:50.792] muffled <- grepl(pattern, "muffleWarning") [15:31:50.792] if (muffled) [15:31:50.792] invokeRestart("muffleWarning") [15:31:50.792] } [15:31:50.792] else if (inherits(cond, "condition")) { [15:31:50.792] if (!is.null(pattern)) { [15:31:50.792] computeRestarts <- base::computeRestarts [15:31:50.792] grepl <- base::grepl [15:31:50.792] restarts <- computeRestarts(cond) [15:31:50.792] for (restart in restarts) { [15:31:50.792] name <- restart$name [15:31:50.792] if (is.null(name)) [15:31:50.792] next [15:31:50.792] if (!grepl(pattern, name)) [15:31:50.792] next [15:31:50.792] invokeRestart(restart) [15:31:50.792] muffled <- TRUE [15:31:50.792] break [15:31:50.792] } [15:31:50.792] } [15:31:50.792] } [15:31:50.792] invisible(muffled) [15:31:50.792] } [15:31:50.792] muffleCondition(cond, pattern = "^muffle") [15:31:50.792] } [15:31:50.792] } [15:31:50.792] else { [15:31:50.792] if (TRUE) { [15:31:50.792] muffleCondition <- function (cond, pattern = "^muffle") [15:31:50.792] { [15:31:50.792] inherits <- base::inherits [15:31:50.792] invokeRestart <- base::invokeRestart [15:31:50.792] is.null <- base::is.null [15:31:50.792] muffled <- FALSE [15:31:50.792] if (inherits(cond, "message")) { [15:31:50.792] muffled <- grepl(pattern, "muffleMessage") [15:31:50.792] if (muffled) [15:31:50.792] invokeRestart("muffleMessage") [15:31:50.792] } [15:31:50.792] else if (inherits(cond, "warning")) { [15:31:50.792] muffled <- grepl(pattern, "muffleWarning") [15:31:50.792] if (muffled) [15:31:50.792] invokeRestart("muffleWarning") [15:31:50.792] } [15:31:50.792] else if (inherits(cond, "condition")) { [15:31:50.792] if (!is.null(pattern)) { [15:31:50.792] computeRestarts <- base::computeRestarts [15:31:50.792] grepl <- base::grepl [15:31:50.792] restarts <- computeRestarts(cond) [15:31:50.792] for (restart in restarts) { [15:31:50.792] name <- restart$name [15:31:50.792] if (is.null(name)) [15:31:50.792] next [15:31:50.792] if (!grepl(pattern, name)) [15:31:50.792] next [15:31:50.792] invokeRestart(restart) [15:31:50.792] muffled <- TRUE [15:31:50.792] break [15:31:50.792] } [15:31:50.792] } [15:31:50.792] } [15:31:50.792] invisible(muffled) [15:31:50.792] } [15:31:50.792] muffleCondition(cond, pattern = "^muffle") [15:31:50.792] } [15:31:50.792] } [15:31:50.792] } [15:31:50.792] })) [15:31:50.792] }, error = function(ex) { [15:31:50.792] base::structure(base::list(value = NULL, visible = NULL, [15:31:50.792] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:50.792] ...future.rng), started = ...future.startTime, [15:31:50.792] finished = Sys.time(), session_uuid = NA_character_, [15:31:50.792] version = "1.8"), class = "FutureResult") [15:31:50.792] }, finally = { [15:31:50.792] if (!identical(...future.workdir, getwd())) [15:31:50.792] setwd(...future.workdir) [15:31:50.792] { [15:31:50.792] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:50.792] ...future.oldOptions$nwarnings <- NULL [15:31:50.792] } [15:31:50.792] base::options(...future.oldOptions) [15:31:50.792] if (.Platform$OS.type == "windows") { [15:31:50.792] old_names <- names(...future.oldEnvVars) [15:31:50.792] envs <- base::Sys.getenv() [15:31:50.792] names <- names(envs) [15:31:50.792] common <- intersect(names, old_names) [15:31:50.792] added <- setdiff(names, old_names) [15:31:50.792] removed <- setdiff(old_names, names) [15:31:50.792] changed <- common[...future.oldEnvVars[common] != [15:31:50.792] envs[common]] [15:31:50.792] NAMES <- toupper(changed) [15:31:50.792] args <- list() [15:31:50.792] for (kk in seq_along(NAMES)) { [15:31:50.792] name <- changed[[kk]] [15:31:50.792] NAME <- NAMES[[kk]] [15:31:50.792] if (name != NAME && is.element(NAME, old_names)) [15:31:50.792] next [15:31:50.792] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:50.792] } [15:31:50.792] NAMES <- toupper(added) [15:31:50.792] for (kk in seq_along(NAMES)) { [15:31:50.792] name <- added[[kk]] [15:31:50.792] NAME <- NAMES[[kk]] [15:31:50.792] if (name != NAME && is.element(NAME, old_names)) [15:31:50.792] next [15:31:50.792] args[[name]] <- "" [15:31:50.792] } [15:31:50.792] NAMES <- toupper(removed) [15:31:50.792] for (kk in seq_along(NAMES)) { [15:31:50.792] name <- removed[[kk]] [15:31:50.792] NAME <- NAMES[[kk]] [15:31:50.792] if (name != NAME && is.element(NAME, old_names)) [15:31:50.792] next [15:31:50.792] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:50.792] } [15:31:50.792] if (length(args) > 0) [15:31:50.792] base::do.call(base::Sys.setenv, args = args) [15:31:50.792] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:50.792] } [15:31:50.792] else { [15:31:50.792] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:50.792] } [15:31:50.792] { [15:31:50.792] if (base::length(...future.futureOptionsAdded) > [15:31:50.792] 0L) { [15:31:50.792] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:50.792] base::names(opts) <- ...future.futureOptionsAdded [15:31:50.792] base::options(opts) [15:31:50.792] } [15:31:50.792] { [15:31:50.792] { [15:31:50.792] NULL [15:31:50.792] RNGkind("Mersenne-Twister") [15:31:50.792] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:50.792] inherits = FALSE) [15:31:50.792] } [15:31:50.792] options(future.plan = NULL) [15:31:50.792] if (is.na(NA_character_)) [15:31:50.792] Sys.unsetenv("R_FUTURE_PLAN") [15:31:50.792] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:50.792] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:50.792] .init = FALSE) [15:31:50.792] } [15:31:50.792] } [15:31:50.792] } [15:31:50.792] }) [15:31:50.792] if (TRUE) { [15:31:50.792] base::sink(type = "output", split = FALSE) [15:31:50.792] if (TRUE) { [15:31:50.792] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:50.792] } [15:31:50.792] else { [15:31:50.792] ...future.result["stdout"] <- base::list(NULL) [15:31:50.792] } [15:31:50.792] base::close(...future.stdout) [15:31:50.792] ...future.stdout <- NULL [15:31:50.792] } [15:31:50.792] ...future.result$conditions <- ...future.conditions [15:31:50.792] ...future.result$finished <- base::Sys.time() [15:31:50.792] ...future.result [15:31:50.792] } [15:31:50.798] assign_globals() ... [15:31:50.798] List of 5 [15:31:50.798] $ ...future.FUN :function (x, ...) [15:31:50.798] $ future.call.arguments : list() [15:31:50.798] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:50.798] $ ...future.elements_ii :List of 2 [15:31:50.798] ..$ b:Classes 'listenv', 'environment' [15:31:50.798] ..$ a:Classes 'listenv', 'environment' [15:31:50.798] $ ...future.seeds_ii : NULL [15:31:50.798] $ ...future.globals.maxSize: NULL [15:31:50.798] - attr(*, "where")=List of 5 [15:31:50.798] ..$ ...future.FUN : [15:31:50.798] ..$ future.call.arguments : [15:31:50.798] ..$ ...future.elements_ii : [15:31:50.798] ..$ ...future.seeds_ii : [15:31:50.798] ..$ ...future.globals.maxSize: [15:31:50.798] - attr(*, "resolved")= logi FALSE [15:31:50.798] - attr(*, "total_size")= num 4968 [15:31:50.798] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:50.798] - attr(*, "already-done")= logi TRUE [15:31:50.807] - copied '...future.FUN' to environment [15:31:50.807] - copied 'future.call.arguments' to environment [15:31:50.808] - copied '...future.elements_ii' to environment [15:31:50.808] - copied '...future.seeds_ii' to environment [15:31:50.808] - copied '...future.globals.maxSize' to environment [15:31:50.808] assign_globals() ... done [15:31:50.809] plan(): Setting new future strategy stack: [15:31:50.810] List of future strategies: [15:31:50.810] 1. sequential: [15:31:50.810] - args: function (..., envir = parent.frame(), workers = "") [15:31:50.810] - tweaked: FALSE [15:31:50.810] - call: NULL [15:31:50.811] plan(): nbrOfWorkers() = 1 [15:31:50.813] plan(): Setting new future strategy stack: [15:31:50.813] List of future strategies: [15:31:50.813] 1. multisession: [15:31:50.813] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:50.813] - tweaked: FALSE [15:31:50.813] - call: plan(strategy) [15:31:50.816] plan(): nbrOfWorkers() = 1 [15:31:50.816] SequentialFuture started (and completed) [15:31:50.817] - Launch lazy future ... done [15:31:50.817] run() for 'SequentialFuture' ... done [15:31:50.817] Created future: [15:31:50.817] SequentialFuture: [15:31:50.817] Label: 'future_lapply-1' [15:31:50.817] Expression: [15:31:50.817] { [15:31:50.817] do.call(function(...) { [15:31:50.817] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:50.817] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:50.817] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:50.817] on.exit(options(oopts), add = TRUE) [15:31:50.817] } [15:31:50.817] { [15:31:50.817] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:50.817] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:50.817] ...future.FUN(...future.X_jj, ...) [15:31:50.817] }) [15:31:50.817] } [15:31:50.817] }, args = future.call.arguments) [15:31:50.817] } [15:31:50.817] Lazy evaluation: FALSE [15:31:50.817] Asynchronous evaluation: FALSE [15:31:50.817] Local evaluation: TRUE [15:31:50.817] Environment: R_GlobalEnv [15:31:50.817] Capture standard output: TRUE [15:31:50.817] Capture condition classes: 'condition' (excluding 'nothing') [15:31:50.817] Globals: 5 objects totaling 17.90 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 13.05 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:50.817] Packages: 1 packages ('listenv') [15:31:50.817] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:50.817] Resolved: TRUE [15:31:50.817] Value: 800 bytes of class 'list' [15:31:50.817] Early signaling: FALSE [15:31:50.817] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:50.817] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:50.819] Chunk #1 of 1 ... DONE [15:31:50.819] Launching 1 futures (chunks) ... DONE [15:31:50.820] Resolving 1 futures (chunks) ... [15:31:50.820] resolve() on list ... [15:31:50.820] recursive: 0 [15:31:50.820] length: 1 [15:31:50.820] [15:31:50.820] resolved() for 'SequentialFuture' ... [15:31:50.821] - state: 'finished' [15:31:50.821] - run: TRUE [15:31:50.821] - result: 'FutureResult' [15:31:50.821] resolved() for 'SequentialFuture' ... done [15:31:50.822] Future #1 [15:31:50.822] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:50.822] - nx: 1 [15:31:50.822] - relay: TRUE [15:31:50.822] - stdout: TRUE [15:31:50.823] - signal: TRUE [15:31:50.823] - resignal: FALSE [15:31:50.823] - force: TRUE [15:31:50.823] - relayed: [n=1] FALSE [15:31:50.823] - queued futures: [n=1] FALSE [15:31:50.827] - until=1 [15:31:50.828] - relaying element #1 [15:31:50.828] - relayed: [n=1] TRUE [15:31:50.828] - queued futures: [n=1] TRUE [15:31:50.828] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:50.829] length: 0 (resolved future 1) [15:31:50.829] Relaying remaining futures [15:31:50.829] signalConditionsASAP(NULL, pos=0) ... [15:31:50.829] - nx: 1 [15:31:50.829] - relay: TRUE [15:31:50.829] - stdout: TRUE [15:31:50.829] - signal: TRUE [15:31:50.830] - resignal: FALSE [15:31:50.830] - force: TRUE [15:31:50.830] - relayed: [n=1] TRUE [15:31:50.830] - queued futures: [n=1] TRUE - flush all [15:31:50.830] - relayed: [n=1] TRUE [15:31:50.831] - queued futures: [n=1] TRUE [15:31:50.831] signalConditionsASAP(NULL, pos=0) ... done [15:31:50.831] resolve() on list ... DONE [15:31:50.831] - Number of value chunks collected: 1 [15:31:50.831] Resolving 1 futures (chunks) ... DONE [15:31:50.832] Reducing values from 1 chunks ... [15:31:50.832] - Number of values collected after concatenation: 2 [15:31:50.832] - Number of values expected: 2 [15:31:50.832] Reverse index remapping (attribute 'ordering'): [n = 2] 2, 1 [15:31:50.832] Reducing values from 1 chunks ... DONE [15:31:50.832] 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) ... [15:31:50.835] future_lapply() ... [15:31:50.838] Number of chunks: 1 [15:31:50.838] getGlobalsAndPackagesXApply() ... [15:31:50.839] - future.globals: TRUE [15:31:50.839] getGlobalsAndPackages() ... [15:31:50.839] Searching for globals... [15:31:50.841] - globals found: [4] 'FUN', 'sqrt', '+', 'a' [15:31:50.841] Searching for globals ... DONE [15:31:50.841] Resolving globals: FALSE [15:31:50.842] The total size of the 2 globals is 1.93 KiB (1976 bytes) [15:31:50.842] The total size of the 2 globals exported for future expression ('FUN()') is 1.93 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are two globals: 'FUN' (1.88 KiB of class 'function') and 'a' (56 bytes of class 'numeric') [15:31:50.843] - globals: [2] 'FUN', 'a' [15:31:50.843] [15:31:50.843] getGlobalsAndPackages() ... DONE [15:31:50.843] - globals found/used: [n=2] 'FUN', 'a' [15:31:50.843] - needed namespaces: [n=0] [15:31:50.844] Finding globals ... DONE [15:31:50.844] - use_args: TRUE [15:31:50.844] - Getting '...' globals ... [15:31:50.844] resolve() on list ... [15:31:50.845] recursive: 0 [15:31:50.845] length: 1 [15:31:50.845] elements: '...' [15:31:50.845] length: 0 (resolved future 1) [15:31:50.845] resolve() on list ... DONE [15:31:50.845] - '...' content: [n=0] [15:31:50.846] List of 1 [15:31:50.846] $ ...: list() [15:31:50.846] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:50.846] - attr(*, "where")=List of 1 [15:31:50.846] ..$ ...: [15:31:50.846] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:50.846] - attr(*, "resolved")= logi TRUE [15:31:50.846] - attr(*, "total_size")= num NA [15:31:50.849] - Getting '...' globals ... DONE [15:31:50.849] Globals to be used in all futures (chunks): [n=3] '...future.FUN', 'a', '...' [15:31:50.850] List of 3 [15:31:50.850] $ ...future.FUN:function (z) [15:31:50.850] $ a : num 3.14 [15:31:50.850] $ ... : list() [15:31:50.850] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:50.850] - attr(*, "where")=List of 3 [15:31:50.850] ..$ ...future.FUN: [15:31:50.850] ..$ a : [15:31:50.850] ..$ ... : [15:31:50.850] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:50.850] - attr(*, "resolved")= logi FALSE [15:31:50.850] - attr(*, "total_size")= num 1976 [15:31:50.854] Packages to be attached in all futures: [n=0] [15:31:50.854] getGlobalsAndPackagesXApply() ... DONE [15:31:50.855] Number of futures (= number of chunks): 1 [15:31:50.855] Launching 1 futures (chunks) ... [15:31:50.855] Chunk #1 of 1 ... [15:31:50.857] - Finding globals in 'X' for chunk #1 ... [15:31:50.857] getGlobalsAndPackages() ... [15:31:50.857] Searching for globals... [15:31:50.865] [15:31:50.865] Searching for globals ... DONE [15:31:50.865] - globals: [0] [15:31:50.865] getGlobalsAndPackages() ... DONE [15:31:50.865] + additional globals found: [n=0] [15:31:50.866] + additional namespaces needed: [n=0] [15:31:50.866] - Finding globals in 'X' for chunk #1 ... DONE [15:31:50.866] - seeds: [15:31:50.866] - All globals exported: [n=6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.866] getGlobalsAndPackages() ... [15:31:50.867] - globals passed as-is: [6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.867] Resolving globals: FALSE [15:31:50.867] Tweak future expression to call with '...' arguments ... [15:31:50.867] { [15:31:50.867] do.call(function(...) { [15:31:50.867] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:50.867] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:50.867] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:50.867] on.exit(options(oopts), add = TRUE) [15:31:50.867] } [15:31:50.867] { [15:31:50.867] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:50.867] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:50.867] ...future.FUN(...future.X_jj, ...) [15:31:50.867] }) [15:31:50.867] } [15:31:50.867] }, args = future.call.arguments) [15:31:50.867] } [15:31:50.868] Tweak future expression to call with '...' arguments ... DONE [15:31:50.868] - globals: [6] '...future.FUN', 'a', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:50.869] [15:31:50.869] getGlobalsAndPackages() ... DONE [15:31:50.869] run() for 'Future' ... [15:31:50.870] - state: 'created' [15:31:50.870] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:50.873] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:50.873] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:50.873] - Field: 'label' [15:31:50.873] - Field: 'local' [15:31:50.874] - Field: 'owner' [15:31:50.874] - Field: 'envir' [15:31:50.874] - Field: 'packages' [15:31:50.874] - Field: 'gc' [15:31:50.874] - Field: 'conditions' [15:31:50.875] - Field: 'expr' [15:31:50.875] - Field: 'uuid' [15:31:50.875] - Field: 'seed' [15:31:50.875] - Field: 'version' [15:31:50.875] - Field: 'result' [15:31:50.876] - Field: 'asynchronous' [15:31:50.876] - Field: 'calls' [15:31:50.876] - Field: 'globals' [15:31:50.876] - Field: 'stdout' [15:31:50.876] - Field: 'earlySignal' [15:31:50.877] - Field: 'lazy' [15:31:50.877] - Field: 'state' [15:31:50.877] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:50.877] - Launch lazy future ... [15:31:50.877] Packages needed by the future expression (n = 0): [15:31:50.878] Packages needed by future strategies (n = 0): [15:31:50.878] { [15:31:50.878] { [15:31:50.878] { [15:31:50.878] ...future.startTime <- base::Sys.time() [15:31:50.878] { [15:31:50.878] { [15:31:50.878] { [15:31:50.878] base::local({ [15:31:50.878] has_future <- base::requireNamespace("future", [15:31:50.878] quietly = TRUE) [15:31:50.878] if (has_future) { [15:31:50.878] ns <- base::getNamespace("future") [15:31:50.878] version <- ns[[".package"]][["version"]] [15:31:50.878] if (is.null(version)) [15:31:50.878] version <- utils::packageVersion("future") [15:31:50.878] } [15:31:50.878] else { [15:31:50.878] version <- NULL [15:31:50.878] } [15:31:50.878] if (!has_future || version < "1.8.0") { [15:31:50.878] info <- base::c(r_version = base::gsub("R version ", [15:31:50.878] "", base::R.version$version.string), [15:31:50.878] platform = base::sprintf("%s (%s-bit)", [15:31:50.878] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:50.878] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:50.878] "release", "version")], collapse = " "), [15:31:50.878] hostname = base::Sys.info()[["nodename"]]) [15:31:50.878] info <- base::sprintf("%s: %s", base::names(info), [15:31:50.878] info) [15:31:50.878] info <- base::paste(info, collapse = "; ") [15:31:50.878] if (!has_future) { [15:31:50.878] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:50.878] info) [15:31:50.878] } [15:31:50.878] else { [15:31:50.878] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:50.878] info, version) [15:31:50.878] } [15:31:50.878] base::stop(msg) [15:31:50.878] } [15:31:50.878] }) [15:31:50.878] } [15:31:50.878] ...future.strategy.old <- future::plan("list") [15:31:50.878] options(future.plan = NULL) [15:31:50.878] Sys.unsetenv("R_FUTURE_PLAN") [15:31:50.878] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:50.878] } [15:31:50.878] ...future.workdir <- getwd() [15:31:50.878] } [15:31:50.878] ...future.oldOptions <- base::as.list(base::.Options) [15:31:50.878] ...future.oldEnvVars <- base::Sys.getenv() [15:31:50.878] } [15:31:50.878] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:50.878] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:50.878] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:50.878] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:50.878] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:50.878] future.stdout.windows.reencode = NULL, width = 80L) [15:31:50.878] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:50.878] base::names(...future.oldOptions)) [15:31:50.878] } [15:31:50.878] if (FALSE) { [15:31:50.878] } [15:31:50.878] else { [15:31:50.878] if (TRUE) { [15:31:50.878] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:50.878] open = "w") [15:31:50.878] } [15:31:50.878] else { [15:31:50.878] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:50.878] windows = "NUL", "/dev/null"), open = "w") [15:31:50.878] } [15:31:50.878] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:50.878] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:50.878] base::sink(type = "output", split = FALSE) [15:31:50.878] base::close(...future.stdout) [15:31:50.878] }, add = TRUE) [15:31:50.878] } [15:31:50.878] ...future.frame <- base::sys.nframe() [15:31:50.878] ...future.conditions <- base::list() [15:31:50.878] ...future.rng <- base::globalenv()$.Random.seed [15:31:50.878] if (FALSE) { [15:31:50.878] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:50.878] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:50.878] } [15:31:50.878] ...future.result <- base::tryCatch({ [15:31:50.878] base::withCallingHandlers({ [15:31:50.878] ...future.value <- base::withVisible(base::local({ [15:31:50.878] do.call(function(...) { [15:31:50.878] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:50.878] if (!identical(...future.globals.maxSize.org, [15:31:50.878] ...future.globals.maxSize)) { [15:31:50.878] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:50.878] on.exit(options(oopts), add = TRUE) [15:31:50.878] } [15:31:50.878] { [15:31:50.878] lapply(seq_along(...future.elements_ii), [15:31:50.878] FUN = function(jj) { [15:31:50.878] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:50.878] ...future.FUN(...future.X_jj, ...) [15:31:50.878] }) [15:31:50.878] } [15:31:50.878] }, args = future.call.arguments) [15:31:50.878] })) [15:31:50.878] future::FutureResult(value = ...future.value$value, [15:31:50.878] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:50.878] ...future.rng), globalenv = if (FALSE) [15:31:50.878] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:50.878] ...future.globalenv.names)) [15:31:50.878] else NULL, started = ...future.startTime, version = "1.8") [15:31:50.878] }, condition = base::local({ [15:31:50.878] c <- base::c [15:31:50.878] inherits <- base::inherits [15:31:50.878] invokeRestart <- base::invokeRestart [15:31:50.878] length <- base::length [15:31:50.878] list <- base::list [15:31:50.878] seq.int <- base::seq.int [15:31:50.878] signalCondition <- base::signalCondition [15:31:50.878] sys.calls <- base::sys.calls [15:31:50.878] `[[` <- base::`[[` [15:31:50.878] `+` <- base::`+` [15:31:50.878] `<<-` <- base::`<<-` [15:31:50.878] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:50.878] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:50.878] 3L)] [15:31:50.878] } [15:31:50.878] function(cond) { [15:31:50.878] is_error <- inherits(cond, "error") [15:31:50.878] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:50.878] NULL) [15:31:50.878] if (is_error) { [15:31:50.878] sessionInformation <- function() { [15:31:50.878] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:50.878] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:50.878] search = base::search(), system = base::Sys.info()) [15:31:50.878] } [15:31:50.878] ...future.conditions[[length(...future.conditions) + [15:31:50.878] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:50.878] cond$call), session = sessionInformation(), [15:31:50.878] timestamp = base::Sys.time(), signaled = 0L) [15:31:50.878] signalCondition(cond) [15:31:50.878] } [15:31:50.878] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:50.878] "immediateCondition"))) { [15:31:50.878] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:50.878] ...future.conditions[[length(...future.conditions) + [15:31:50.878] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:50.878] if (TRUE && !signal) { [15:31:50.878] muffleCondition <- function (cond, pattern = "^muffle") [15:31:50.878] { [15:31:50.878] inherits <- base::inherits [15:31:50.878] invokeRestart <- base::invokeRestart [15:31:50.878] is.null <- base::is.null [15:31:50.878] muffled <- FALSE [15:31:50.878] if (inherits(cond, "message")) { [15:31:50.878] muffled <- grepl(pattern, "muffleMessage") [15:31:50.878] if (muffled) [15:31:50.878] invokeRestart("muffleMessage") [15:31:50.878] } [15:31:50.878] else if (inherits(cond, "warning")) { [15:31:50.878] muffled <- grepl(pattern, "muffleWarning") [15:31:50.878] if (muffled) [15:31:50.878] invokeRestart("muffleWarning") [15:31:50.878] } [15:31:50.878] else if (inherits(cond, "condition")) { [15:31:50.878] if (!is.null(pattern)) { [15:31:50.878] computeRestarts <- base::computeRestarts [15:31:50.878] grepl <- base::grepl [15:31:50.878] restarts <- computeRestarts(cond) [15:31:50.878] for (restart in restarts) { [15:31:50.878] name <- restart$name [15:31:50.878] if (is.null(name)) [15:31:50.878] next [15:31:50.878] if (!grepl(pattern, name)) [15:31:50.878] next [15:31:50.878] invokeRestart(restart) [15:31:50.878] muffled <- TRUE [15:31:50.878] break [15:31:50.878] } [15:31:50.878] } [15:31:50.878] } [15:31:50.878] invisible(muffled) [15:31:50.878] } [15:31:50.878] muffleCondition(cond, pattern = "^muffle") [15:31:50.878] } [15:31:50.878] } [15:31:50.878] else { [15:31:50.878] if (TRUE) { [15:31:50.878] muffleCondition <- function (cond, pattern = "^muffle") [15:31:50.878] { [15:31:50.878] inherits <- base::inherits [15:31:50.878] invokeRestart <- base::invokeRestart [15:31:50.878] is.null <- base::is.null [15:31:50.878] muffled <- FALSE [15:31:50.878] if (inherits(cond, "message")) { [15:31:50.878] muffled <- grepl(pattern, "muffleMessage") [15:31:50.878] if (muffled) [15:31:50.878] invokeRestart("muffleMessage") [15:31:50.878] } [15:31:50.878] else if (inherits(cond, "warning")) { [15:31:50.878] muffled <- grepl(pattern, "muffleWarning") [15:31:50.878] if (muffled) [15:31:50.878] invokeRestart("muffleWarning") [15:31:50.878] } [15:31:50.878] else if (inherits(cond, "condition")) { [15:31:50.878] if (!is.null(pattern)) { [15:31:50.878] computeRestarts <- base::computeRestarts [15:31:50.878] grepl <- base::grepl [15:31:50.878] restarts <- computeRestarts(cond) [15:31:50.878] for (restart in restarts) { [15:31:50.878] name <- restart$name [15:31:50.878] if (is.null(name)) [15:31:50.878] next [15:31:50.878] if (!grepl(pattern, name)) [15:31:50.878] next [15:31:50.878] invokeRestart(restart) [15:31:50.878] muffled <- TRUE [15:31:50.878] break [15:31:50.878] } [15:31:50.878] } [15:31:50.878] } [15:31:50.878] invisible(muffled) [15:31:50.878] } [15:31:50.878] muffleCondition(cond, pattern = "^muffle") [15:31:50.878] } [15:31:50.878] } [15:31:50.878] } [15:31:50.878] })) [15:31:50.878] }, error = function(ex) { [15:31:50.878] base::structure(base::list(value = NULL, visible = NULL, [15:31:50.878] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:50.878] ...future.rng), started = ...future.startTime, [15:31:50.878] finished = Sys.time(), session_uuid = NA_character_, [15:31:50.878] version = "1.8"), class = "FutureResult") [15:31:50.878] }, finally = { [15:31:50.878] if (!identical(...future.workdir, getwd())) [15:31:50.878] setwd(...future.workdir) [15:31:50.878] { [15:31:50.878] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:50.878] ...future.oldOptions$nwarnings <- NULL [15:31:50.878] } [15:31:50.878] base::options(...future.oldOptions) [15:31:50.878] if (.Platform$OS.type == "windows") { [15:31:50.878] old_names <- names(...future.oldEnvVars) [15:31:50.878] envs <- base::Sys.getenv() [15:31:50.878] names <- names(envs) [15:31:50.878] common <- intersect(names, old_names) [15:31:50.878] added <- setdiff(names, old_names) [15:31:50.878] removed <- setdiff(old_names, names) [15:31:50.878] changed <- common[...future.oldEnvVars[common] != [15:31:50.878] envs[common]] [15:31:50.878] NAMES <- toupper(changed) [15:31:50.878] args <- list() [15:31:50.878] for (kk in seq_along(NAMES)) { [15:31:50.878] name <- changed[[kk]] [15:31:50.878] NAME <- NAMES[[kk]] [15:31:50.878] if (name != NAME && is.element(NAME, old_names)) [15:31:50.878] next [15:31:50.878] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:50.878] } [15:31:50.878] NAMES <- toupper(added) [15:31:50.878] for (kk in seq_along(NAMES)) { [15:31:50.878] name <- added[[kk]] [15:31:50.878] NAME <- NAMES[[kk]] [15:31:50.878] if (name != NAME && is.element(NAME, old_names)) [15:31:50.878] next [15:31:50.878] args[[name]] <- "" [15:31:50.878] } [15:31:50.878] NAMES <- toupper(removed) [15:31:50.878] for (kk in seq_along(NAMES)) { [15:31:50.878] name <- removed[[kk]] [15:31:50.878] NAME <- NAMES[[kk]] [15:31:50.878] if (name != NAME && is.element(NAME, old_names)) [15:31:50.878] next [15:31:50.878] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:50.878] } [15:31:50.878] if (length(args) > 0) [15:31:50.878] base::do.call(base::Sys.setenv, args = args) [15:31:50.878] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:50.878] } [15:31:50.878] else { [15:31:50.878] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:50.878] } [15:31:50.878] { [15:31:50.878] if (base::length(...future.futureOptionsAdded) > [15:31:50.878] 0L) { [15:31:50.878] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:50.878] base::names(opts) <- ...future.futureOptionsAdded [15:31:50.878] base::options(opts) [15:31:50.878] } [15:31:50.878] { [15:31:50.878] { [15:31:50.878] NULL [15:31:50.878] RNGkind("Mersenne-Twister") [15:31:50.878] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:50.878] inherits = FALSE) [15:31:50.878] } [15:31:50.878] options(future.plan = NULL) [15:31:50.878] if (is.na(NA_character_)) [15:31:50.878] Sys.unsetenv("R_FUTURE_PLAN") [15:31:50.878] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:50.878] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:50.878] .init = FALSE) [15:31:50.878] } [15:31:50.878] } [15:31:50.878] } [15:31:50.878] }) [15:31:50.878] if (TRUE) { [15:31:50.878] base::sink(type = "output", split = FALSE) [15:31:50.878] if (TRUE) { [15:31:50.878] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:50.878] } [15:31:50.878] else { [15:31:50.878] ...future.result["stdout"] <- base::list(NULL) [15:31:50.878] } [15:31:50.878] base::close(...future.stdout) [15:31:50.878] ...future.stdout <- NULL [15:31:50.878] } [15:31:50.878] ...future.result$conditions <- ...future.conditions [15:31:50.878] ...future.result$finished <- base::Sys.time() [15:31:50.878] ...future.result [15:31:50.878] } [15:31:50.883] assign_globals() ... [15:31:50.883] List of 6 [15:31:50.883] $ ...future.FUN :function (z) [15:31:50.883] $ a : num 3.14 [15:31:50.883] $ future.call.arguments : list() [15:31:50.883] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:50.883] $ ...future.elements_ii :List of 10000 [15:31:50.883] ..$ : int 1 [15:31:50.883] ..$ : int 2 [15:31:50.883] ..$ : int 3 [15:31:50.883] ..$ : int 4 [15:31:50.883] ..$ : int 5 [15:31:50.883] ..$ : int 6 [15:31:50.883] ..$ : int 7 [15:31:50.883] ..$ : int 8 [15:31:50.883] ..$ : int 9 [15:31:50.883] ..$ : int 10 [15:31:50.883] ..$ : int 11 [15:31:50.883] ..$ : int 12 [15:31:50.883] ..$ : int 13 [15:31:50.883] ..$ : int 14 [15:31:50.883] ..$ : int 15 [15:31:50.883] ..$ : int 16 [15:31:50.883] ..$ : int 17 [15:31:50.883] ..$ : int 18 [15:31:50.883] ..$ : int 19 [15:31:50.883] ..$ : int 20 [15:31:50.883] ..$ : int 21 [15:31:50.883] ..$ : int 22 [15:31:50.883] ..$ : int 23 [15:31:50.883] ..$ : int 24 [15:31:50.883] ..$ : int 25 [15:31:50.883] ..$ : int 26 [15:31:50.883] ..$ : int 27 [15:31:50.883] ..$ : int 28 [15:31:50.883] ..$ : int 29 [15:31:50.883] ..$ : int 30 [15:31:50.883] ..$ : int 31 [15:31:50.883] ..$ : int 32 [15:31:50.883] ..$ : int 33 [15:31:50.883] ..$ : int 34 [15:31:50.883] ..$ : int 35 [15:31:50.883] ..$ : int 36 [15:31:50.883] ..$ : int 37 [15:31:50.883] ..$ : int 38 [15:31:50.883] ..$ : int 39 [15:31:50.883] ..$ : int 40 [15:31:50.883] ..$ : int 41 [15:31:50.883] ..$ : int 42 [15:31:50.883] ..$ : int 43 [15:31:50.883] ..$ : int 44 [15:31:50.883] ..$ : int 45 [15:31:50.883] ..$ : int 46 [15:31:50.883] ..$ : int 47 [15:31:50.883] ..$ : int 48 [15:31:50.883] ..$ : int 49 [15:31:50.883] ..$ : int 50 [15:31:50.883] ..$ : int 51 [15:31:50.883] ..$ : int 52 [15:31:50.883] ..$ : int 53 [15:31:50.883] ..$ : int 54 [15:31:50.883] ..$ : int 55 [15:31:50.883] ..$ : int 56 [15:31:50.883] ..$ : int 57 [15:31:50.883] ..$ : int 58 [15:31:50.883] ..$ : int 59 [15:31:50.883] ..$ : int 60 [15:31:50.883] ..$ : int 61 [15:31:50.883] ..$ : int 62 [15:31:50.883] ..$ : int 63 [15:31:50.883] ..$ : int 64 [15:31:50.883] ..$ : int 65 [15:31:50.883] ..$ : int 66 [15:31:50.883] ..$ : int 67 [15:31:50.883] ..$ : int 68 [15:31:50.883] ..$ : int 69 [15:31:50.883] ..$ : int 70 [15:31:50.883] ..$ : int 71 [15:31:50.883] ..$ : int 72 [15:31:50.883] ..$ : int 73 [15:31:50.883] ..$ : int 74 [15:31:50.883] ..$ : int 75 [15:31:50.883] ..$ : int 76 [15:31:50.883] ..$ : int 77 [15:31:50.883] ..$ : int 78 [15:31:50.883] ..$ : int 79 [15:31:50.883] ..$ : int 80 [15:31:50.883] ..$ : int 81 [15:31:50.883] ..$ : int 82 [15:31:50.883] ..$ : int 83 [15:31:50.883] ..$ : int 84 [15:31:50.883] ..$ : int 85 [15:31:50.883] ..$ : int 86 [15:31:50.883] ..$ : int 87 [15:31:50.883] ..$ : int 88 [15:31:50.883] ..$ : int 89 [15:31:50.883] ..$ : int 90 [15:31:50.883] ..$ : int 91 [15:31:50.883] ..$ : int 92 [15:31:50.883] ..$ : int 93 [15:31:50.883] ..$ : int 94 [15:31:50.883] ..$ : int 95 [15:31:50.883] ..$ : int 96 [15:31:50.883] ..$ : int 97 [15:31:50.883] ..$ : int 98 [15:31:50.883] ..$ : int 99 [15:31:50.883] .. [list output truncated] [15:31:50.883] $ ...future.seeds_ii : NULL [15:31:50.883] $ ...future.globals.maxSize: NULL [15:31:50.883] - attr(*, "where")=List of 6 [15:31:50.883] ..$ ...future.FUN : [15:31:50.883] ..$ a : [15:31:50.883] ..$ future.call.arguments : [15:31:50.883] ..$ ...future.elements_ii : [15:31:50.883] ..$ ...future.seeds_ii : [15:31:50.883] ..$ ...future.globals.maxSize: [15:31:50.883] - attr(*, "resolved")= logi FALSE [15:31:50.883] - attr(*, "total_size")= num 1976 [15:31:50.883] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:50.883] - attr(*, "already-done")= logi TRUE [15:31:50.960] - reassign environment for '...future.FUN' [15:31:50.960] - copied '...future.FUN' to environment [15:31:50.961] - copied 'a' to environment [15:31:50.961] - copied 'future.call.arguments' to environment [15:31:50.961] - copied '...future.elements_ii' to environment [15:31:50.962] - copied '...future.seeds_ii' to environment [15:31:50.962] - copied '...future.globals.maxSize' to environment [15:31:50.962] assign_globals() ... done [15:31:50.963] plan(): Setting new future strategy stack: [15:31:50.963] List of future strategies: [15:31:50.963] 1. sequential: [15:31:50.963] - args: function (..., envir = parent.frame(), workers = "") [15:31:50.963] - tweaked: FALSE [15:31:50.963] - call: NULL [15:31:50.964] plan(): nbrOfWorkers() = 1 [15:31:51.000] plan(): Setting new future strategy stack: [15:31:51.000] List of future strategies: [15:31:51.000] 1. multisession: [15:31:51.000] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:51.000] - tweaked: FALSE [15:31:51.000] - call: plan(strategy) [15:31:51.005] plan(): nbrOfWorkers() = 1 [15:31:51.005] SequentialFuture started (and completed) [15:31:51.006] - Launch lazy future ... done [15:31:51.006] run() for 'SequentialFuture' ... done [15:31:51.006] Created future: [15:31:51.007] SequentialFuture: [15:31:51.007] Label: 'future_lapply-1' [15:31:51.007] Expression: [15:31:51.007] { [15:31:51.007] do.call(function(...) { [15:31:51.007] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.007] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:51.007] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.007] on.exit(options(oopts), add = TRUE) [15:31:51.007] } [15:31:51.007] { [15:31:51.007] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:51.007] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.007] ...future.FUN(...future.X_jj, ...) [15:31:51.007] }) [15:31:51.007] } [15:31:51.007] }, args = future.call.arguments) [15:31:51.007] } [15:31:51.007] Lazy evaluation: FALSE [15:31:51.007] Asynchronous evaluation: FALSE [15:31:51.007] Local evaluation: TRUE [15:31:51.007] Environment: R_GlobalEnv [15:31:51.007] Capture standard output: TRUE [15:31:51.007] Capture condition classes: 'condition' (excluding 'nothing') [15:31:51.007] Globals: 6 objects totaling 548.80 KiB (function '...future.FUN' of 1.88 KiB, numeric 'a' of 56 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 546.88 KiB, NULL '...future.seeds_ii' of 0 bytes, ...) [15:31:51.007] Packages: [15:31:51.007] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:51.007] Resolved: TRUE [15:31:51.007] Value: 546.88 KiB of class 'list' [15:31:51.007] Early signaling: FALSE [15:31:51.007] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:51.007] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:51.172] Chunk #1 of 1 ... DONE [15:31:51.173] Launching 1 futures (chunks) ... DONE [15:31:51.173] Resolving 1 futures (chunks) ... [15:31:51.173] resolve() on list ... [15:31:51.173] recursive: 0 [15:31:51.173] length: 1 [15:31:51.174] [15:31:51.174] resolved() for 'SequentialFuture' ... [15:31:51.174] - state: 'finished' [15:31:51.174] - run: TRUE [15:31:51.174] - result: 'FutureResult' [15:31:51.175] resolved() for 'SequentialFuture' ... done [15:31:51.175] Future #1 [15:31:51.175] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:51.175] - nx: 1 [15:31:51.175] - relay: TRUE [15:31:51.176] - stdout: TRUE [15:31:51.176] - signal: TRUE [15:31:51.176] - resignal: FALSE [15:31:51.176] - force: TRUE [15:31:51.176] - relayed: [n=1] FALSE [15:31:51.176] - queued futures: [n=1] FALSE [15:31:51.176] - until=1 [15:31:51.177] - relaying element #1 [15:31:51.177] - relayed: [n=1] TRUE [15:31:51.177] - queued futures: [n=1] TRUE [15:31:51.177] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:51.178] length: 0 (resolved future 1) [15:31:51.178] Relaying remaining futures [15:31:51.178] signalConditionsASAP(NULL, pos=0) ... [15:31:51.178] - nx: 1 [15:31:51.178] - relay: TRUE [15:31:51.178] - stdout: TRUE [15:31:51.178] - signal: TRUE [15:31:51.179] - resignal: FALSE [15:31:51.179] - force: TRUE [15:31:51.179] - relayed: [n=1] TRUE [15:31:51.179] - queued futures: [n=1] TRUE - flush all [15:31:51.179] - relayed: [n=1] TRUE [15:31:51.180] - queued futures: [n=1] TRUE [15:31:51.180] signalConditionsASAP(NULL, pos=0) ... done [15:31:51.180] resolve() on list ... DONE [15:31:51.180] - Number of value chunks collected: 1 [15:31:51.181] Resolving 1 futures (chunks) ... DONE [15:31:51.181] Reducing values from 1 chunks ... [15:31:51.181] - Number of values collected after concatenation: 10000 [15:31:51.181] - Number of values expected: 10000 [15:31:51.181] Reducing values from 1 chunks ... DONE [15:31:51.182] future_lapply() ... DONE - future_lapply(x, FUN = table, ...) ... [15:31:51.183] future_lapply() ... [15:31:51.242] Number of chunks: 1 [15:31:51.242] getGlobalsAndPackagesXApply() ... [15:31:51.242] - future.globals: TRUE [15:31:51.242] getGlobalsAndPackages() ... [15:31:51.242] Searching for globals... [15:31:51.306] - 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<-' [15:31:51.306] Searching for globals ... DONE [15:31:51.307] Resolving globals: FALSE [15:31:51.310] The total size of the 1 globals is 345.92 KiB (354224 bytes) [15:31:51.311] The total size of the 1 globals exported for future expression ('FUN()') is 345.92 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (345.92 KiB of class 'function') [15:31:51.311] - globals: [1] 'FUN' [15:31:51.312] [15:31:51.312] getGlobalsAndPackages() ... DONE [15:31:51.312] - globals found/used: [n=1] 'FUN' [15:31:51.313] - needed namespaces: [n=0] [15:31:51.313] Finding globals ... DONE [15:31:51.313] - use_args: TRUE [15:31:51.313] - Getting '...' globals ... [15:31:51.314] resolve() on list ... [15:31:51.315] recursive: 0 [15:31:51.315] length: 1 [15:31:51.315] elements: '...' [15:31:51.315] length: 0 (resolved future 1) [15:31:51.316] resolve() on list ... DONE [15:31:51.316] - '...' content: [n=0] [15:31:51.316] List of 1 [15:31:51.316] $ ...: list() [15:31:51.316] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:51.316] - attr(*, "where")=List of 1 [15:31:51.316] ..$ ...: [15:31:51.316] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:51.316] - attr(*, "resolved")= logi TRUE [15:31:51.316] - attr(*, "total_size")= num NA [15:31:51.322] - Getting '...' globals ... DONE [15:31:51.322] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:51.322] List of 2 [15:31:51.322] $ ...future.FUN:function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [15:31:51.322] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [15:31:51.322] $ ... : list() [15:31:51.322] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:51.322] - attr(*, "where")=List of 2 [15:31:51.322] ..$ ...future.FUN: [15:31:51.322] ..$ ... : [15:31:51.322] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:51.322] - attr(*, "resolved")= logi FALSE [15:31:51.322] - attr(*, "total_size")= num 354224 [15:31:51.328] Packages to be attached in all futures: [n=0] [15:31:51.328] getGlobalsAndPackagesXApply() ... DONE [15:31:51.329] Number of futures (= number of chunks): 1 [15:31:51.329] Launching 1 futures (chunks) ... [15:31:51.330] Chunk #1 of 1 ... [15:31:51.330] - Finding globals in 'X' for chunk #1 ... [15:31:51.330] getGlobalsAndPackages() ... [15:31:51.331] Searching for globals... [15:31:51.331] [15:31:51.331] Searching for globals ... DONE [15:31:51.332] - globals: [0] [15:31:51.332] getGlobalsAndPackages() ... DONE [15:31:51.332] + additional globals found: [n=0] [15:31:51.333] + additional namespaces needed: [n=0] [15:31:51.333] - Finding globals in 'X' for chunk #1 ... DONE [15:31:51.333] - seeds: [15:31:51.333] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.334] getGlobalsAndPackages() ... [15:31:51.334] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.334] Resolving globals: FALSE [15:31:51.335] Tweak future expression to call with '...' arguments ... [15:31:51.335] { [15:31:51.335] do.call(function(...) { [15:31:51.335] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.335] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:51.335] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.335] on.exit(options(oopts), add = TRUE) [15:31:51.335] } [15:31:51.335] { [15:31:51.335] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:51.335] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.335] ...future.FUN(...future.X_jj, ...) [15:31:51.335] }) [15:31:51.335] } [15:31:51.335] }, args = future.call.arguments) [15:31:51.335] } [15:31:51.336] Tweak future expression to call with '...' arguments ... DONE [15:31:51.337] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.337] [15:31:51.337] getGlobalsAndPackages() ... DONE [15:31:51.338] run() for 'Future' ... [15:31:51.338] - state: 'created' [15:31:51.339] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:51.343] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:51.343] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:51.343] - Field: 'label' [15:31:51.344] - Field: 'local' [15:31:51.344] - Field: 'owner' [15:31:51.344] - Field: 'envir' [15:31:51.344] - Field: 'packages' [15:31:51.344] - Field: 'gc' [15:31:51.344] - Field: 'conditions' [15:31:51.345] - Field: 'expr' [15:31:51.345] - Field: 'uuid' [15:31:51.345] - Field: 'seed' [15:31:51.345] - Field: 'version' [15:31:51.345] - Field: 'result' [15:31:51.346] - Field: 'asynchronous' [15:31:51.346] - Field: 'calls' [15:31:51.346] - Field: 'globals' [15:31:51.346] - Field: 'stdout' [15:31:51.346] - Field: 'earlySignal' [15:31:51.347] - Field: 'lazy' [15:31:51.347] - Field: 'state' [15:31:51.347] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:51.347] - Launch lazy future ... [15:31:51.347] Packages needed by the future expression (n = 0): [15:31:51.348] Packages needed by future strategies (n = 0): [15:31:51.348] { [15:31:51.348] { [15:31:51.348] { [15:31:51.348] ...future.startTime <- base::Sys.time() [15:31:51.348] { [15:31:51.348] { [15:31:51.348] { [15:31:51.348] base::local({ [15:31:51.348] has_future <- base::requireNamespace("future", [15:31:51.348] quietly = TRUE) [15:31:51.348] if (has_future) { [15:31:51.348] ns <- base::getNamespace("future") [15:31:51.348] version <- ns[[".package"]][["version"]] [15:31:51.348] if (is.null(version)) [15:31:51.348] version <- utils::packageVersion("future") [15:31:51.348] } [15:31:51.348] else { [15:31:51.348] version <- NULL [15:31:51.348] } [15:31:51.348] if (!has_future || version < "1.8.0") { [15:31:51.348] info <- base::c(r_version = base::gsub("R version ", [15:31:51.348] "", base::R.version$version.string), [15:31:51.348] platform = base::sprintf("%s (%s-bit)", [15:31:51.348] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:51.348] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:51.348] "release", "version")], collapse = " "), [15:31:51.348] hostname = base::Sys.info()[["nodename"]]) [15:31:51.348] info <- base::sprintf("%s: %s", base::names(info), [15:31:51.348] info) [15:31:51.348] info <- base::paste(info, collapse = "; ") [15:31:51.348] if (!has_future) { [15:31:51.348] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:51.348] info) [15:31:51.348] } [15:31:51.348] else { [15:31:51.348] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:51.348] info, version) [15:31:51.348] } [15:31:51.348] base::stop(msg) [15:31:51.348] } [15:31:51.348] }) [15:31:51.348] } [15:31:51.348] ...future.strategy.old <- future::plan("list") [15:31:51.348] options(future.plan = NULL) [15:31:51.348] Sys.unsetenv("R_FUTURE_PLAN") [15:31:51.348] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:51.348] } [15:31:51.348] ...future.workdir <- getwd() [15:31:51.348] } [15:31:51.348] ...future.oldOptions <- base::as.list(base::.Options) [15:31:51.348] ...future.oldEnvVars <- base::Sys.getenv() [15:31:51.348] } [15:31:51.348] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:51.348] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:51.348] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:51.348] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:51.348] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:51.348] future.stdout.windows.reencode = NULL, width = 80L) [15:31:51.348] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:51.348] base::names(...future.oldOptions)) [15:31:51.348] } [15:31:51.348] if (FALSE) { [15:31:51.348] } [15:31:51.348] else { [15:31:51.348] if (TRUE) { [15:31:51.348] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:51.348] open = "w") [15:31:51.348] } [15:31:51.348] else { [15:31:51.348] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:51.348] windows = "NUL", "/dev/null"), open = "w") [15:31:51.348] } [15:31:51.348] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:51.348] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:51.348] base::sink(type = "output", split = FALSE) [15:31:51.348] base::close(...future.stdout) [15:31:51.348] }, add = TRUE) [15:31:51.348] } [15:31:51.348] ...future.frame <- base::sys.nframe() [15:31:51.348] ...future.conditions <- base::list() [15:31:51.348] ...future.rng <- base::globalenv()$.Random.seed [15:31:51.348] if (FALSE) { [15:31:51.348] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:51.348] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:51.348] } [15:31:51.348] ...future.result <- base::tryCatch({ [15:31:51.348] base::withCallingHandlers({ [15:31:51.348] ...future.value <- base::withVisible(base::local({ [15:31:51.348] do.call(function(...) { [15:31:51.348] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.348] if (!identical(...future.globals.maxSize.org, [15:31:51.348] ...future.globals.maxSize)) { [15:31:51.348] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.348] on.exit(options(oopts), add = TRUE) [15:31:51.348] } [15:31:51.348] { [15:31:51.348] lapply(seq_along(...future.elements_ii), [15:31:51.348] FUN = function(jj) { [15:31:51.348] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.348] ...future.FUN(...future.X_jj, ...) [15:31:51.348] }) [15:31:51.348] } [15:31:51.348] }, args = future.call.arguments) [15:31:51.348] })) [15:31:51.348] future::FutureResult(value = ...future.value$value, [15:31:51.348] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:51.348] ...future.rng), globalenv = if (FALSE) [15:31:51.348] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:51.348] ...future.globalenv.names)) [15:31:51.348] else NULL, started = ...future.startTime, version = "1.8") [15:31:51.348] }, condition = base::local({ [15:31:51.348] c <- base::c [15:31:51.348] inherits <- base::inherits [15:31:51.348] invokeRestart <- base::invokeRestart [15:31:51.348] length <- base::length [15:31:51.348] list <- base::list [15:31:51.348] seq.int <- base::seq.int [15:31:51.348] signalCondition <- base::signalCondition [15:31:51.348] sys.calls <- base::sys.calls [15:31:51.348] `[[` <- base::`[[` [15:31:51.348] `+` <- base::`+` [15:31:51.348] `<<-` <- base::`<<-` [15:31:51.348] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:51.348] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:51.348] 3L)] [15:31:51.348] } [15:31:51.348] function(cond) { [15:31:51.348] is_error <- inherits(cond, "error") [15:31:51.348] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:51.348] NULL) [15:31:51.348] if (is_error) { [15:31:51.348] sessionInformation <- function() { [15:31:51.348] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:51.348] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:51.348] search = base::search(), system = base::Sys.info()) [15:31:51.348] } [15:31:51.348] ...future.conditions[[length(...future.conditions) + [15:31:51.348] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:51.348] cond$call), session = sessionInformation(), [15:31:51.348] timestamp = base::Sys.time(), signaled = 0L) [15:31:51.348] signalCondition(cond) [15:31:51.348] } [15:31:51.348] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:51.348] "immediateCondition"))) { [15:31:51.348] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:51.348] ...future.conditions[[length(...future.conditions) + [15:31:51.348] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:51.348] if (TRUE && !signal) { [15:31:51.348] muffleCondition <- function (cond, pattern = "^muffle") [15:31:51.348] { [15:31:51.348] inherits <- base::inherits [15:31:51.348] invokeRestart <- base::invokeRestart [15:31:51.348] is.null <- base::is.null [15:31:51.348] muffled <- FALSE [15:31:51.348] if (inherits(cond, "message")) { [15:31:51.348] muffled <- grepl(pattern, "muffleMessage") [15:31:51.348] if (muffled) [15:31:51.348] invokeRestart("muffleMessage") [15:31:51.348] } [15:31:51.348] else if (inherits(cond, "warning")) { [15:31:51.348] muffled <- grepl(pattern, "muffleWarning") [15:31:51.348] if (muffled) [15:31:51.348] invokeRestart("muffleWarning") [15:31:51.348] } [15:31:51.348] else if (inherits(cond, "condition")) { [15:31:51.348] if (!is.null(pattern)) { [15:31:51.348] computeRestarts <- base::computeRestarts [15:31:51.348] grepl <- base::grepl [15:31:51.348] restarts <- computeRestarts(cond) [15:31:51.348] for (restart in restarts) { [15:31:51.348] name <- restart$name [15:31:51.348] if (is.null(name)) [15:31:51.348] next [15:31:51.348] if (!grepl(pattern, name)) [15:31:51.348] next [15:31:51.348] invokeRestart(restart) [15:31:51.348] muffled <- TRUE [15:31:51.348] break [15:31:51.348] } [15:31:51.348] } [15:31:51.348] } [15:31:51.348] invisible(muffled) [15:31:51.348] } [15:31:51.348] muffleCondition(cond, pattern = "^muffle") [15:31:51.348] } [15:31:51.348] } [15:31:51.348] else { [15:31:51.348] if (TRUE) { [15:31:51.348] muffleCondition <- function (cond, pattern = "^muffle") [15:31:51.348] { [15:31:51.348] inherits <- base::inherits [15:31:51.348] invokeRestart <- base::invokeRestart [15:31:51.348] is.null <- base::is.null [15:31:51.348] muffled <- FALSE [15:31:51.348] if (inherits(cond, "message")) { [15:31:51.348] muffled <- grepl(pattern, "muffleMessage") [15:31:51.348] if (muffled) [15:31:51.348] invokeRestart("muffleMessage") [15:31:51.348] } [15:31:51.348] else if (inherits(cond, "warning")) { [15:31:51.348] muffled <- grepl(pattern, "muffleWarning") [15:31:51.348] if (muffled) [15:31:51.348] invokeRestart("muffleWarning") [15:31:51.348] } [15:31:51.348] else if (inherits(cond, "condition")) { [15:31:51.348] if (!is.null(pattern)) { [15:31:51.348] computeRestarts <- base::computeRestarts [15:31:51.348] grepl <- base::grepl [15:31:51.348] restarts <- computeRestarts(cond) [15:31:51.348] for (restart in restarts) { [15:31:51.348] name <- restart$name [15:31:51.348] if (is.null(name)) [15:31:51.348] next [15:31:51.348] if (!grepl(pattern, name)) [15:31:51.348] next [15:31:51.348] invokeRestart(restart) [15:31:51.348] muffled <- TRUE [15:31:51.348] break [15:31:51.348] } [15:31:51.348] } [15:31:51.348] } [15:31:51.348] invisible(muffled) [15:31:51.348] } [15:31:51.348] muffleCondition(cond, pattern = "^muffle") [15:31:51.348] } [15:31:51.348] } [15:31:51.348] } [15:31:51.348] })) [15:31:51.348] }, error = function(ex) { [15:31:51.348] base::structure(base::list(value = NULL, visible = NULL, [15:31:51.348] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:51.348] ...future.rng), started = ...future.startTime, [15:31:51.348] finished = Sys.time(), session_uuid = NA_character_, [15:31:51.348] version = "1.8"), class = "FutureResult") [15:31:51.348] }, finally = { [15:31:51.348] if (!identical(...future.workdir, getwd())) [15:31:51.348] setwd(...future.workdir) [15:31:51.348] { [15:31:51.348] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:51.348] ...future.oldOptions$nwarnings <- NULL [15:31:51.348] } [15:31:51.348] base::options(...future.oldOptions) [15:31:51.348] if (.Platform$OS.type == "windows") { [15:31:51.348] old_names <- names(...future.oldEnvVars) [15:31:51.348] envs <- base::Sys.getenv() [15:31:51.348] names <- names(envs) [15:31:51.348] common <- intersect(names, old_names) [15:31:51.348] added <- setdiff(names, old_names) [15:31:51.348] removed <- setdiff(old_names, names) [15:31:51.348] changed <- common[...future.oldEnvVars[common] != [15:31:51.348] envs[common]] [15:31:51.348] NAMES <- toupper(changed) [15:31:51.348] args <- list() [15:31:51.348] for (kk in seq_along(NAMES)) { [15:31:51.348] name <- changed[[kk]] [15:31:51.348] NAME <- NAMES[[kk]] [15:31:51.348] if (name != NAME && is.element(NAME, old_names)) [15:31:51.348] next [15:31:51.348] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:51.348] } [15:31:51.348] NAMES <- toupper(added) [15:31:51.348] for (kk in seq_along(NAMES)) { [15:31:51.348] name <- added[[kk]] [15:31:51.348] NAME <- NAMES[[kk]] [15:31:51.348] if (name != NAME && is.element(NAME, old_names)) [15:31:51.348] next [15:31:51.348] args[[name]] <- "" [15:31:51.348] } [15:31:51.348] NAMES <- toupper(removed) [15:31:51.348] for (kk in seq_along(NAMES)) { [15:31:51.348] name <- removed[[kk]] [15:31:51.348] NAME <- NAMES[[kk]] [15:31:51.348] if (name != NAME && is.element(NAME, old_names)) [15:31:51.348] next [15:31:51.348] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:51.348] } [15:31:51.348] if (length(args) > 0) [15:31:51.348] base::do.call(base::Sys.setenv, args = args) [15:31:51.348] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:51.348] } [15:31:51.348] else { [15:31:51.348] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:51.348] } [15:31:51.348] { [15:31:51.348] if (base::length(...future.futureOptionsAdded) > [15:31:51.348] 0L) { [15:31:51.348] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:51.348] base::names(opts) <- ...future.futureOptionsAdded [15:31:51.348] base::options(opts) [15:31:51.348] } [15:31:51.348] { [15:31:51.348] { [15:31:51.348] NULL [15:31:51.348] RNGkind("Mersenne-Twister") [15:31:51.348] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:51.348] inherits = FALSE) [15:31:51.348] } [15:31:51.348] options(future.plan = NULL) [15:31:51.348] if (is.na(NA_character_)) [15:31:51.348] Sys.unsetenv("R_FUTURE_PLAN") [15:31:51.348] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:51.348] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:51.348] .init = FALSE) [15:31:51.348] } [15:31:51.348] } [15:31:51.348] } [15:31:51.348] }) [15:31:51.348] if (TRUE) { [15:31:51.348] base::sink(type = "output", split = FALSE) [15:31:51.348] if (TRUE) { [15:31:51.348] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:51.348] } [15:31:51.348] else { [15:31:51.348] ...future.result["stdout"] <- base::list(NULL) [15:31:51.348] } [15:31:51.348] base::close(...future.stdout) [15:31:51.348] ...future.stdout <- NULL [15:31:51.348] } [15:31:51.348] ...future.result$conditions <- ...future.conditions [15:31:51.348] ...future.result$finished <- base::Sys.time() [15:31:51.348] ...future.result [15:31:51.348] } [15:31:51.353] assign_globals() ... [15:31:51.354] List of 5 [15:31:51.354] $ ...future.FUN :function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [15:31:51.354] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [15:31:51.354] $ future.call.arguments : list() [15:31:51.354] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:51.354] $ ...future.elements_ii :List of 2 [15:31:51.354] ..$ a: int [1:4] 1 2 3 4 [15:31:51.354] ..$ b: int [1:4] 5 6 7 8 [15:31:51.354] $ ...future.seeds_ii : NULL [15:31:51.354] $ ...future.globals.maxSize: NULL [15:31:51.354] - attr(*, "where")=List of 5 [15:31:51.354] ..$ ...future.FUN : [15:31:51.354] ..$ future.call.arguments : [15:31:51.354] ..$ ...future.elements_ii : [15:31:51.354] ..$ ...future.seeds_ii : [15:31:51.354] ..$ ...future.globals.maxSize: [15:31:51.354] - attr(*, "resolved")= logi FALSE [15:31:51.354] - attr(*, "total_size")= num 354224 [15:31:51.354] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:51.354] - attr(*, "already-done")= logi TRUE [15:31:51.361] - copied '...future.FUN' to environment [15:31:51.361] - copied 'future.call.arguments' to environment [15:31:51.362] - copied '...future.elements_ii' to environment [15:31:51.362] - copied '...future.seeds_ii' to environment [15:31:51.362] - copied '...future.globals.maxSize' to environment [15:31:51.362] assign_globals() ... done [15:31:51.363] plan(): Setting new future strategy stack: [15:31:51.363] List of future strategies: [15:31:51.363] 1. sequential: [15:31:51.363] - args: function (..., envir = parent.frame(), workers = "") [15:31:51.363] - tweaked: FALSE [15:31:51.363] - call: NULL [15:31:51.364] plan(): nbrOfWorkers() = 1 [15:31:51.366] plan(): Setting new future strategy stack: [15:31:51.367] List of future strategies: [15:31:51.367] 1. multisession: [15:31:51.367] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:51.367] - tweaked: FALSE [15:31:51.367] - call: plan(strategy) [15:31:51.371] plan(): nbrOfWorkers() = 1 [15:31:51.371] SequentialFuture started (and completed) [15:31:51.372] - Launch lazy future ... done [15:31:51.372] run() for 'SequentialFuture' ... done [15:31:51.372] Created future: [15:31:51.373] SequentialFuture: [15:31:51.373] Label: 'future_lapply-1' [15:31:51.373] Expression: [15:31:51.373] { [15:31:51.373] do.call(function(...) { [15:31:51.373] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.373] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:51.373] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.373] on.exit(options(oopts), add = TRUE) [15:31:51.373] } [15:31:51.373] { [15:31:51.373] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:51.373] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.373] ...future.FUN(...future.X_jj, ...) [15:31:51.373] }) [15:31:51.373] } [15:31:51.373] }, args = future.call.arguments) [15:31:51.373] } [15:31:51.373] Lazy evaluation: FALSE [15:31:51.373] Asynchronous evaluation: FALSE [15:31:51.373] Local evaluation: TRUE [15:31:51.373] Environment: R_GlobalEnv [15:31:51.373] Capture standard output: TRUE [15:31:51.373] Capture condition classes: 'condition' (excluding 'nothing') [15:31:51.373] Globals: 5 objects totaling 346.05 KiB (function '...future.FUN' of 345.92 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 128 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:51.373] Packages: [15:31:51.373] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:51.373] Resolved: TRUE [15:31:51.373] Value: 2.27 KiB of class 'list' [15:31:51.373] Early signaling: FALSE [15:31:51.373] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:51.373] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:51.375] Chunk #1 of 1 ... DONE [15:31:51.375] Launching 1 futures (chunks) ... DONE [15:31:51.376] Resolving 1 futures (chunks) ... [15:31:51.376] resolve() on list ... [15:31:51.376] recursive: 0 [15:31:51.377] length: 1 [15:31:51.377] [15:31:51.377] resolved() for 'SequentialFuture' ... [15:31:51.378] - state: 'finished' [15:31:51.378] - run: TRUE [15:31:51.378] - result: 'FutureResult' [15:31:51.379] resolved() for 'SequentialFuture' ... done [15:31:51.379] Future #1 [15:31:51.379] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:51.379] - nx: 1 [15:31:51.380] - relay: TRUE [15:31:51.380] - stdout: TRUE [15:31:51.380] - signal: TRUE [15:31:51.380] - resignal: FALSE [15:31:51.381] - force: TRUE [15:31:51.381] - relayed: [n=1] FALSE [15:31:51.381] - queued futures: [n=1] FALSE [15:31:51.382] - until=1 [15:31:51.382] - relaying element #1 [15:31:51.382] - relayed: [n=1] TRUE [15:31:51.383] - queued futures: [n=1] TRUE [15:31:51.383] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:51.384] length: 0 (resolved future 1) [15:31:51.384] Relaying remaining futures [15:31:51.384] signalConditionsASAP(NULL, pos=0) ... [15:31:51.384] - nx: 1 [15:31:51.385] - relay: TRUE [15:31:51.385] - stdout: TRUE [15:31:51.385] - signal: TRUE [15:31:51.386] - resignal: FALSE [15:31:51.386] - force: TRUE [15:31:51.386] - relayed: [n=1] TRUE [15:31:51.386] - queued futures: [n=1] TRUE - flush all [15:31:51.387] - relayed: [n=1] TRUE [15:31:51.387] - queued futures: [n=1] TRUE [15:31:51.388] signalConditionsASAP(NULL, pos=0) ... done [15:31:51.388] resolve() on list ... DONE [15:31:51.388] - Number of value chunks collected: 1 [15:31:51.389] Resolving 1 futures (chunks) ... DONE [15:31:51.389] Reducing values from 1 chunks ... [15:31:51.389] - Number of values collected after concatenation: 2 [15:31:51.389] - Number of values expected: 2 [15:31:51.390] Reducing values from 1 chunks ... DONE [15:31:51.390] future_lapply() ... DONE - future_lapply(x, ...) where length(x) != length(as.list(x)) ... [15:31:51.391] future_lapply() ... [15:31:51.395] Number of chunks: 1 [15:31:51.395] getGlobalsAndPackagesXApply() ... [15:31:51.395] - future.globals: TRUE [15:31:51.396] getGlobalsAndPackages() ... [15:31:51.396] Searching for globals... [15:31:51.397] - globals found: [1] 'FUN' [15:31:51.398] Searching for globals ... DONE [15:31:51.398] Resolving globals: FALSE [15:31:51.399] The total size of the 1 globals is 56 bytes (56 bytes) [15:31:51.399] The total size of the 1 globals exported for future expression ('FUN()') is 56 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (56 bytes of class 'function') [15:31:51.400] - globals: [1] 'FUN' [15:31:51.400] [15:31:51.400] getGlobalsAndPackages() ... DONE [15:31:51.400] - globals found/used: [n=1] 'FUN' [15:31:51.401] - needed namespaces: [n=0] [15:31:51.401] Finding globals ... DONE [15:31:51.401] - use_args: TRUE [15:31:51.401] - Getting '...' globals ... [15:31:51.402] resolve() on list ... [15:31:51.402] recursive: 0 [15:31:51.402] length: 1 [15:31:51.402] elements: '...' [15:31:51.403] length: 0 (resolved future 1) [15:31:51.403] resolve() on list ... DONE [15:31:51.403] - '...' content: [n=0] [15:31:51.403] List of 1 [15:31:51.403] $ ...: list() [15:31:51.403] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:51.403] - attr(*, "where")=List of 1 [15:31:51.403] ..$ ...: [15:31:51.403] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:51.403] - attr(*, "resolved")= logi TRUE [15:31:51.403] - attr(*, "total_size")= num NA [15:31:51.408] - Getting '...' globals ... DONE [15:31:51.408] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:51.408] List of 2 [15:31:51.408] $ ...future.FUN:function (x) [15:31:51.408] $ ... : list() [15:31:51.408] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:51.408] - attr(*, "where")=List of 2 [15:31:51.408] ..$ ...future.FUN: [15:31:51.408] ..$ ... : [15:31:51.408] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:51.408] - attr(*, "resolved")= logi FALSE [15:31:51.408] - attr(*, "total_size")= num 56 [15:31:51.416] Packages to be attached in all futures: [n=0] [15:31:51.417] getGlobalsAndPackagesXApply() ... DONE [15:31:51.417] Number of futures (= number of chunks): 1 [15:31:51.418] Launching 1 futures (chunks) ... [15:31:51.418] Chunk #1 of 1 ... [15:31:51.418] - Finding globals in 'X' for chunk #1 ... [15:31:51.418] getGlobalsAndPackages() ... [15:31:51.419] Searching for globals... [15:31:51.419] [15:31:51.420] Searching for globals ... DONE [15:31:51.420] - globals: [0] [15:31:51.420] getGlobalsAndPackages() ... DONE [15:31:51.420] + additional globals found: [n=0] [15:31:51.421] + additional namespaces needed: [n=0] [15:31:51.421] - Finding globals in 'X' for chunk #1 ... DONE [15:31:51.421] - seeds: [15:31:51.421] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.422] getGlobalsAndPackages() ... [15:31:51.422] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.422] Resolving globals: FALSE [15:31:51.423] Tweak future expression to call with '...' arguments ... [15:31:51.423] { [15:31:51.423] do.call(function(...) { [15:31:51.423] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.423] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:51.423] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.423] on.exit(options(oopts), add = TRUE) [15:31:51.423] } [15:31:51.423] { [15:31:51.423] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:51.423] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.423] ...future.FUN(...future.X_jj, ...) [15:31:51.423] }) [15:31:51.423] } [15:31:51.423] }, args = future.call.arguments) [15:31:51.423] } [15:31:51.424] Tweak future expression to call with '...' arguments ... DONE [15:31:51.425] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.425] [15:31:51.425] getGlobalsAndPackages() ... DONE [15:31:51.426] run() for 'Future' ... [15:31:51.426] - state: 'created' [15:31:51.427] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:51.431] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:51.431] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:51.432] - Field: 'label' [15:31:51.432] - Field: 'local' [15:31:51.432] - Field: 'owner' [15:31:51.433] - Field: 'envir' [15:31:51.433] - Field: 'packages' [15:31:51.433] - Field: 'gc' [15:31:51.434] - Field: 'conditions' [15:31:51.434] - Field: 'expr' [15:31:51.434] - Field: 'uuid' [15:31:51.434] - Field: 'seed' [15:31:51.435] - Field: 'version' [15:31:51.435] - Field: 'result' [15:31:51.435] - Field: 'asynchronous' [15:31:51.436] - Field: 'calls' [15:31:51.436] - Field: 'globals' [15:31:51.436] - Field: 'stdout' [15:31:51.436] - Field: 'earlySignal' [15:31:51.437] - Field: 'lazy' [15:31:51.437] - Field: 'state' [15:31:51.437] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:51.438] - Launch lazy future ... [15:31:51.438] Packages needed by the future expression (n = 0): [15:31:51.438] Packages needed by future strategies (n = 0): [15:31:51.439] { [15:31:51.439] { [15:31:51.439] { [15:31:51.439] ...future.startTime <- base::Sys.time() [15:31:51.439] { [15:31:51.439] { [15:31:51.439] { [15:31:51.439] base::local({ [15:31:51.439] has_future <- base::requireNamespace("future", [15:31:51.439] quietly = TRUE) [15:31:51.439] if (has_future) { [15:31:51.439] ns <- base::getNamespace("future") [15:31:51.439] version <- ns[[".package"]][["version"]] [15:31:51.439] if (is.null(version)) [15:31:51.439] version <- utils::packageVersion("future") [15:31:51.439] } [15:31:51.439] else { [15:31:51.439] version <- NULL [15:31:51.439] } [15:31:51.439] if (!has_future || version < "1.8.0") { [15:31:51.439] info <- base::c(r_version = base::gsub("R version ", [15:31:51.439] "", base::R.version$version.string), [15:31:51.439] platform = base::sprintf("%s (%s-bit)", [15:31:51.439] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:51.439] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:51.439] "release", "version")], collapse = " "), [15:31:51.439] hostname = base::Sys.info()[["nodename"]]) [15:31:51.439] info <- base::sprintf("%s: %s", base::names(info), [15:31:51.439] info) [15:31:51.439] info <- base::paste(info, collapse = "; ") [15:31:51.439] if (!has_future) { [15:31:51.439] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:51.439] info) [15:31:51.439] } [15:31:51.439] else { [15:31:51.439] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:51.439] info, version) [15:31:51.439] } [15:31:51.439] base::stop(msg) [15:31:51.439] } [15:31:51.439] }) [15:31:51.439] } [15:31:51.439] ...future.strategy.old <- future::plan("list") [15:31:51.439] options(future.plan = NULL) [15:31:51.439] Sys.unsetenv("R_FUTURE_PLAN") [15:31:51.439] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:51.439] } [15:31:51.439] ...future.workdir <- getwd() [15:31:51.439] } [15:31:51.439] ...future.oldOptions <- base::as.list(base::.Options) [15:31:51.439] ...future.oldEnvVars <- base::Sys.getenv() [15:31:51.439] } [15:31:51.439] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:51.439] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:51.439] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:51.439] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:51.439] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:51.439] future.stdout.windows.reencode = NULL, width = 80L) [15:31:51.439] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:51.439] base::names(...future.oldOptions)) [15:31:51.439] } [15:31:51.439] if (FALSE) { [15:31:51.439] } [15:31:51.439] else { [15:31:51.439] if (TRUE) { [15:31:51.439] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:51.439] open = "w") [15:31:51.439] } [15:31:51.439] else { [15:31:51.439] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:51.439] windows = "NUL", "/dev/null"), open = "w") [15:31:51.439] } [15:31:51.439] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:51.439] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:51.439] base::sink(type = "output", split = FALSE) [15:31:51.439] base::close(...future.stdout) [15:31:51.439] }, add = TRUE) [15:31:51.439] } [15:31:51.439] ...future.frame <- base::sys.nframe() [15:31:51.439] ...future.conditions <- base::list() [15:31:51.439] ...future.rng <- base::globalenv()$.Random.seed [15:31:51.439] if (FALSE) { [15:31:51.439] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:51.439] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:51.439] } [15:31:51.439] ...future.result <- base::tryCatch({ [15:31:51.439] base::withCallingHandlers({ [15:31:51.439] ...future.value <- base::withVisible(base::local({ [15:31:51.439] do.call(function(...) { [15:31:51.439] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.439] if (!identical(...future.globals.maxSize.org, [15:31:51.439] ...future.globals.maxSize)) { [15:31:51.439] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.439] on.exit(options(oopts), add = TRUE) [15:31:51.439] } [15:31:51.439] { [15:31:51.439] lapply(seq_along(...future.elements_ii), [15:31:51.439] FUN = function(jj) { [15:31:51.439] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.439] ...future.FUN(...future.X_jj, ...) [15:31:51.439] }) [15:31:51.439] } [15:31:51.439] }, args = future.call.arguments) [15:31:51.439] })) [15:31:51.439] future::FutureResult(value = ...future.value$value, [15:31:51.439] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:51.439] ...future.rng), globalenv = if (FALSE) [15:31:51.439] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:51.439] ...future.globalenv.names)) [15:31:51.439] else NULL, started = ...future.startTime, version = "1.8") [15:31:51.439] }, condition = base::local({ [15:31:51.439] c <- base::c [15:31:51.439] inherits <- base::inherits [15:31:51.439] invokeRestart <- base::invokeRestart [15:31:51.439] length <- base::length [15:31:51.439] list <- base::list [15:31:51.439] seq.int <- base::seq.int [15:31:51.439] signalCondition <- base::signalCondition [15:31:51.439] sys.calls <- base::sys.calls [15:31:51.439] `[[` <- base::`[[` [15:31:51.439] `+` <- base::`+` [15:31:51.439] `<<-` <- base::`<<-` [15:31:51.439] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:51.439] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:51.439] 3L)] [15:31:51.439] } [15:31:51.439] function(cond) { [15:31:51.439] is_error <- inherits(cond, "error") [15:31:51.439] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:51.439] NULL) [15:31:51.439] if (is_error) { [15:31:51.439] sessionInformation <- function() { [15:31:51.439] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:51.439] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:51.439] search = base::search(), system = base::Sys.info()) [15:31:51.439] } [15:31:51.439] ...future.conditions[[length(...future.conditions) + [15:31:51.439] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:51.439] cond$call), session = sessionInformation(), [15:31:51.439] timestamp = base::Sys.time(), signaled = 0L) [15:31:51.439] signalCondition(cond) [15:31:51.439] } [15:31:51.439] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:51.439] "immediateCondition"))) { [15:31:51.439] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:51.439] ...future.conditions[[length(...future.conditions) + [15:31:51.439] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:51.439] if (TRUE && !signal) { [15:31:51.439] muffleCondition <- function (cond, pattern = "^muffle") [15:31:51.439] { [15:31:51.439] inherits <- base::inherits [15:31:51.439] invokeRestart <- base::invokeRestart [15:31:51.439] is.null <- base::is.null [15:31:51.439] muffled <- FALSE [15:31:51.439] if (inherits(cond, "message")) { [15:31:51.439] muffled <- grepl(pattern, "muffleMessage") [15:31:51.439] if (muffled) [15:31:51.439] invokeRestart("muffleMessage") [15:31:51.439] } [15:31:51.439] else if (inherits(cond, "warning")) { [15:31:51.439] muffled <- grepl(pattern, "muffleWarning") [15:31:51.439] if (muffled) [15:31:51.439] invokeRestart("muffleWarning") [15:31:51.439] } [15:31:51.439] else if (inherits(cond, "condition")) { [15:31:51.439] if (!is.null(pattern)) { [15:31:51.439] computeRestarts <- base::computeRestarts [15:31:51.439] grepl <- base::grepl [15:31:51.439] restarts <- computeRestarts(cond) [15:31:51.439] for (restart in restarts) { [15:31:51.439] name <- restart$name [15:31:51.439] if (is.null(name)) [15:31:51.439] next [15:31:51.439] if (!grepl(pattern, name)) [15:31:51.439] next [15:31:51.439] invokeRestart(restart) [15:31:51.439] muffled <- TRUE [15:31:51.439] break [15:31:51.439] } [15:31:51.439] } [15:31:51.439] } [15:31:51.439] invisible(muffled) [15:31:51.439] } [15:31:51.439] muffleCondition(cond, pattern = "^muffle") [15:31:51.439] } [15:31:51.439] } [15:31:51.439] else { [15:31:51.439] if (TRUE) { [15:31:51.439] muffleCondition <- function (cond, pattern = "^muffle") [15:31:51.439] { [15:31:51.439] inherits <- base::inherits [15:31:51.439] invokeRestart <- base::invokeRestart [15:31:51.439] is.null <- base::is.null [15:31:51.439] muffled <- FALSE [15:31:51.439] if (inherits(cond, "message")) { [15:31:51.439] muffled <- grepl(pattern, "muffleMessage") [15:31:51.439] if (muffled) [15:31:51.439] invokeRestart("muffleMessage") [15:31:51.439] } [15:31:51.439] else if (inherits(cond, "warning")) { [15:31:51.439] muffled <- grepl(pattern, "muffleWarning") [15:31:51.439] if (muffled) [15:31:51.439] invokeRestart("muffleWarning") [15:31:51.439] } [15:31:51.439] else if (inherits(cond, "condition")) { [15:31:51.439] if (!is.null(pattern)) { [15:31:51.439] computeRestarts <- base::computeRestarts [15:31:51.439] grepl <- base::grepl [15:31:51.439] restarts <- computeRestarts(cond) [15:31:51.439] for (restart in restarts) { [15:31:51.439] name <- restart$name [15:31:51.439] if (is.null(name)) [15:31:51.439] next [15:31:51.439] if (!grepl(pattern, name)) [15:31:51.439] next [15:31:51.439] invokeRestart(restart) [15:31:51.439] muffled <- TRUE [15:31:51.439] break [15:31:51.439] } [15:31:51.439] } [15:31:51.439] } [15:31:51.439] invisible(muffled) [15:31:51.439] } [15:31:51.439] muffleCondition(cond, pattern = "^muffle") [15:31:51.439] } [15:31:51.439] } [15:31:51.439] } [15:31:51.439] })) [15:31:51.439] }, error = function(ex) { [15:31:51.439] base::structure(base::list(value = NULL, visible = NULL, [15:31:51.439] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:51.439] ...future.rng), started = ...future.startTime, [15:31:51.439] finished = Sys.time(), session_uuid = NA_character_, [15:31:51.439] version = "1.8"), class = "FutureResult") [15:31:51.439] }, finally = { [15:31:51.439] if (!identical(...future.workdir, getwd())) [15:31:51.439] setwd(...future.workdir) [15:31:51.439] { [15:31:51.439] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:51.439] ...future.oldOptions$nwarnings <- NULL [15:31:51.439] } [15:31:51.439] base::options(...future.oldOptions) [15:31:51.439] if (.Platform$OS.type == "windows") { [15:31:51.439] old_names <- names(...future.oldEnvVars) [15:31:51.439] envs <- base::Sys.getenv() [15:31:51.439] names <- names(envs) [15:31:51.439] common <- intersect(names, old_names) [15:31:51.439] added <- setdiff(names, old_names) [15:31:51.439] removed <- setdiff(old_names, names) [15:31:51.439] changed <- common[...future.oldEnvVars[common] != [15:31:51.439] envs[common]] [15:31:51.439] NAMES <- toupper(changed) [15:31:51.439] args <- list() [15:31:51.439] for (kk in seq_along(NAMES)) { [15:31:51.439] name <- changed[[kk]] [15:31:51.439] NAME <- NAMES[[kk]] [15:31:51.439] if (name != NAME && is.element(NAME, old_names)) [15:31:51.439] next [15:31:51.439] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:51.439] } [15:31:51.439] NAMES <- toupper(added) [15:31:51.439] for (kk in seq_along(NAMES)) { [15:31:51.439] name <- added[[kk]] [15:31:51.439] NAME <- NAMES[[kk]] [15:31:51.439] if (name != NAME && is.element(NAME, old_names)) [15:31:51.439] next [15:31:51.439] args[[name]] <- "" [15:31:51.439] } [15:31:51.439] NAMES <- toupper(removed) [15:31:51.439] for (kk in seq_along(NAMES)) { [15:31:51.439] name <- removed[[kk]] [15:31:51.439] NAME <- NAMES[[kk]] [15:31:51.439] if (name != NAME && is.element(NAME, old_names)) [15:31:51.439] next [15:31:51.439] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:51.439] } [15:31:51.439] if (length(args) > 0) [15:31:51.439] base::do.call(base::Sys.setenv, args = args) [15:31:51.439] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:51.439] } [15:31:51.439] else { [15:31:51.439] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:51.439] } [15:31:51.439] { [15:31:51.439] if (base::length(...future.futureOptionsAdded) > [15:31:51.439] 0L) { [15:31:51.439] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:51.439] base::names(opts) <- ...future.futureOptionsAdded [15:31:51.439] base::options(opts) [15:31:51.439] } [15:31:51.439] { [15:31:51.439] { [15:31:51.439] NULL [15:31:51.439] RNGkind("Mersenne-Twister") [15:31:51.439] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:51.439] inherits = FALSE) [15:31:51.439] } [15:31:51.439] options(future.plan = NULL) [15:31:51.439] if (is.na(NA_character_)) [15:31:51.439] Sys.unsetenv("R_FUTURE_PLAN") [15:31:51.439] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:51.439] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:51.439] .init = FALSE) [15:31:51.439] } [15:31:51.439] } [15:31:51.439] } [15:31:51.439] }) [15:31:51.439] if (TRUE) { [15:31:51.439] base::sink(type = "output", split = FALSE) [15:31:51.439] if (TRUE) { [15:31:51.439] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:51.439] } [15:31:51.439] else { [15:31:51.439] ...future.result["stdout"] <- base::list(NULL) [15:31:51.439] } [15:31:51.439] base::close(...future.stdout) [15:31:51.439] ...future.stdout <- NULL [15:31:51.439] } [15:31:51.439] ...future.result$conditions <- ...future.conditions [15:31:51.439] ...future.result$finished <- base::Sys.time() [15:31:51.439] ...future.result [15:31:51.439] } [15:31:51.446] assign_globals() ... [15:31:51.446] List of 5 [15:31:51.446] $ ...future.FUN :function (x) [15:31:51.446] $ future.call.arguments : list() [15:31:51.446] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:51.446] $ ...future.elements_ii :List of 3 [15:31:51.446] ..$ a: num 1 [15:31:51.446] ..$ b: num 2 [15:31:51.446] ..$ c: num 3 [15:31:51.446] $ ...future.seeds_ii : NULL [15:31:51.446] $ ...future.globals.maxSize: NULL [15:31:51.446] - attr(*, "where")=List of 5 [15:31:51.446] ..$ ...future.FUN : [15:31:51.446] ..$ future.call.arguments : [15:31:51.446] ..$ ...future.elements_ii : [15:31:51.446] ..$ ...future.seeds_ii : [15:31:51.446] ..$ ...future.globals.maxSize: [15:31:51.446] - attr(*, "resolved")= logi FALSE [15:31:51.446] - attr(*, "total_size")= num 56 [15:31:51.446] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:51.446] - attr(*, "already-done")= logi TRUE [15:31:51.457] - copied '...future.FUN' to environment [15:31:51.457] - copied 'future.call.arguments' to environment [15:31:51.458] - copied '...future.elements_ii' to environment [15:31:51.458] - copied '...future.seeds_ii' to environment [15:31:51.458] - copied '...future.globals.maxSize' to environment [15:31:51.458] assign_globals() ... done [15:31:51.459] plan(): Setting new future strategy stack: [15:31:51.459] List of future strategies: [15:31:51.459] 1. sequential: [15:31:51.459] - args: function (..., envir = parent.frame(), workers = "") [15:31:51.459] - tweaked: FALSE [15:31:51.459] - call: NULL [15:31:51.460] plan(): nbrOfWorkers() = 1 [15:31:51.463] plan(): Setting new future strategy stack: [15:31:51.463] List of future strategies: [15:31:51.463] 1. multisession: [15:31:51.463] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:51.463] - tweaked: FALSE [15:31:51.463] - call: plan(strategy) [15:31:51.467] plan(): nbrOfWorkers() = 1 [15:31:51.467] SequentialFuture started (and completed) [15:31:51.468] - Launch lazy future ... done [15:31:51.468] run() for 'SequentialFuture' ... done [15:31:51.468] Created future: [15:31:51.469] SequentialFuture: [15:31:51.469] Label: 'future_lapply-1' [15:31:51.469] Expression: [15:31:51.469] { [15:31:51.469] do.call(function(...) { [15:31:51.469] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.469] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:51.469] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.469] on.exit(options(oopts), add = TRUE) [15:31:51.469] } [15:31:51.469] { [15:31:51.469] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:51.469] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.469] ...future.FUN(...future.X_jj, ...) [15:31:51.469] }) [15:31:51.469] } [15:31:51.469] }, args = future.call.arguments) [15:31:51.469] } [15:31:51.469] Lazy evaluation: FALSE [15:31:51.469] Asynchronous evaluation: FALSE [15:31:51.469] Local evaluation: TRUE [15:31:51.469] Environment: R_GlobalEnv [15:31:51.469] Capture standard output: TRUE [15:31:51.469] Capture condition classes: 'condition' (excluding 'nothing') [15:31:51.469] Globals: 5 objects totaling 224 bytes (function '...future.FUN' of 56 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 168 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:51.469] Packages: [15:31:51.469] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:51.469] Resolved: TRUE [15:31:51.469] Value: 168 bytes of class 'list' [15:31:51.469] Early signaling: FALSE [15:31:51.469] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:51.469] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:51.471] Chunk #1 of 1 ... DONE [15:31:51.471] Launching 1 futures (chunks) ... DONE [15:31:51.471] Resolving 1 futures (chunks) ... [15:31:51.472] resolve() on list ... [15:31:51.472] recursive: 0 [15:31:51.472] length: 1 [15:31:51.472] [15:31:51.473] resolved() for 'SequentialFuture' ... [15:31:51.473] - state: 'finished' [15:31:51.473] - run: TRUE [15:31:51.474] - result: 'FutureResult' [15:31:51.474] resolved() for 'SequentialFuture' ... done [15:31:51.474] Future #1 [15:31:51.475] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:51.475] - nx: 1 [15:31:51.475] - relay: TRUE [15:31:51.476] - stdout: TRUE [15:31:51.476] - signal: TRUE [15:31:51.476] - resignal: FALSE [15:31:51.476] - force: TRUE [15:31:51.477] - relayed: [n=1] FALSE [15:31:51.477] - queued futures: [n=1] FALSE [15:31:51.477] - until=1 [15:31:51.478] - relaying element #1 [15:31:51.478] - relayed: [n=1] TRUE [15:31:51.478] - queued futures: [n=1] TRUE [15:31:51.479] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:51.479] length: 0 (resolved future 1) [15:31:51.479] Relaying remaining futures [15:31:51.479] signalConditionsASAP(NULL, pos=0) ... [15:31:51.480] - nx: 1 [15:31:51.480] - relay: TRUE [15:31:51.480] - stdout: TRUE [15:31:51.480] - signal: TRUE [15:31:51.481] - resignal: FALSE [15:31:51.481] - force: TRUE [15:31:51.481] - relayed: [n=1] TRUE [15:31:51.481] - queued futures: [n=1] TRUE - flush all [15:31:51.482] - relayed: [n=1] TRUE [15:31:51.482] - queued futures: [n=1] TRUE [15:31:51.482] signalConditionsASAP(NULL, pos=0) ... done [15:31:51.483] resolve() on list ... DONE [15:31:51.483] - Number of value chunks collected: 1 [15:31:51.483] Resolving 1 futures (chunks) ... DONE [15:31:51.484] Reducing values from 1 chunks ... [15:31:51.484] - Number of values collected after concatenation: 3 [15:31:51.484] - Number of values expected: 3 [15:31:51.484] Reducing values from 1 chunks ... DONE [15:31:51.485] future_lapply() ... DONE - future_lapply(x, ...) where x[[i]] subsets via S3 method ... [15:31:51.485] future_lapply() ... [15:31:51.490] Number of chunks: 1 [15:31:51.490] getGlobalsAndPackagesXApply() ... [15:31:51.490] - future.globals: TRUE [15:31:51.491] getGlobalsAndPackages() ... [15:31:51.491] Searching for globals... [15:31:51.493] - globals found: [1] 'FUN' [15:31:51.493] Searching for globals ... DONE [15:31:51.493] Resolving globals: FALSE [15:31:51.494] The total size of the 1 globals is 848 bytes (848 bytes) [15:31:51.495] The total size of the 1 globals exported for future expression ('FUN()') is 848 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (848 bytes of class 'function') [15:31:51.495] - globals: [1] 'FUN' [15:31:51.495] [15:31:51.496] getGlobalsAndPackages() ... DONE [15:31:51.496] - globals found/used: [n=1] 'FUN' [15:31:51.496] - needed namespaces: [n=0] [15:31:51.497] Finding globals ... DONE [15:31:51.497] - use_args: TRUE [15:31:51.497] - Getting '...' globals ... [15:31:51.498] resolve() on list ... [15:31:51.498] recursive: 0 [15:31:51.499] length: 1 [15:31:51.499] elements: '...' [15:31:51.499] length: 0 (resolved future 1) [15:31:51.499] resolve() on list ... DONE [15:31:51.500] - '...' content: [n=0] [15:31:51.500] List of 1 [15:31:51.500] $ ...: list() [15:31:51.500] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:51.500] - attr(*, "where")=List of 1 [15:31:51.500] ..$ ...: [15:31:51.500] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:51.500] - attr(*, "resolved")= logi TRUE [15:31:51.500] - attr(*, "total_size")= num NA [15:31:51.505] - Getting '...' globals ... DONE [15:31:51.506] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:51.506] List of 2 [15:31:51.506] $ ...future.FUN:function (x) [15:31:51.506] $ ... : list() [15:31:51.506] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:51.506] - attr(*, "where")=List of 2 [15:31:51.506] ..$ ...future.FUN: [15:31:51.506] ..$ ... : [15:31:51.506] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:51.506] - attr(*, "resolved")= logi FALSE [15:31:51.506] - attr(*, "total_size")= num 848 [15:31:51.511] Packages to be attached in all futures: [n=0] [15:31:51.511] getGlobalsAndPackagesXApply() ... DONE [15:31:51.512] Number of futures (= number of chunks): 1 [15:31:51.512] Launching 1 futures (chunks) ... [15:31:51.512] Chunk #1 of 1 ... [15:31:51.513] - Finding globals in 'X' for chunk #1 ... [15:31:51.513] getGlobalsAndPackages() ... [15:31:51.513] Searching for globals... [15:31:51.514] [15:31:51.514] Searching for globals ... DONE [15:31:51.514] - globals: [0] [15:31:51.515] getGlobalsAndPackages() ... DONE [15:31:51.515] + additional globals found: [n=0] [15:31:51.515] + additional namespaces needed: [n=0] [15:31:51.515] - Finding globals in 'X' for chunk #1 ... DONE [15:31:51.516] - seeds: [15:31:51.516] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.516] getGlobalsAndPackages() ... [15:31:51.516] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.517] Resolving globals: FALSE [15:31:51.517] Tweak future expression to call with '...' arguments ... [15:31:51.517] { [15:31:51.517] do.call(function(...) { [15:31:51.517] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.517] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:51.517] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.517] on.exit(options(oopts), add = TRUE) [15:31:51.517] } [15:31:51.517] { [15:31:51.517] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:51.517] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.517] ...future.FUN(...future.X_jj, ...) [15:31:51.517] }) [15:31:51.517] } [15:31:51.517] }, args = future.call.arguments) [15:31:51.517] } [15:31:51.518] Tweak future expression to call with '...' arguments ... DONE [15:31:51.519] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.519] [15:31:51.519] getGlobalsAndPackages() ... DONE [15:31:51.520] run() for 'Future' ... [15:31:51.520] - state: 'created' [15:31:51.521] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:51.525] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:51.525] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:51.525] - Field: 'label' [15:31:51.526] - Field: 'local' [15:31:51.526] - Field: 'owner' [15:31:51.526] - Field: 'envir' [15:31:51.526] - Field: 'packages' [15:31:51.527] - Field: 'gc' [15:31:51.527] - Field: 'conditions' [15:31:51.527] - Field: 'expr' [15:31:51.528] - Field: 'uuid' [15:31:51.528] - Field: 'seed' [15:31:51.528] - Field: 'version' [15:31:51.529] - Field: 'result' [15:31:51.529] - Field: 'asynchronous' [15:31:51.529] - Field: 'calls' [15:31:51.529] - Field: 'globals' [15:31:51.530] - Field: 'stdout' [15:31:51.530] - Field: 'earlySignal' [15:31:51.530] - Field: 'lazy' [15:31:51.531] - Field: 'state' [15:31:51.531] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:51.531] - Launch lazy future ... [15:31:51.532] Packages needed by the future expression (n = 0): [15:31:51.532] Packages needed by future strategies (n = 0): [15:31:51.533] { [15:31:51.533] { [15:31:51.533] { [15:31:51.533] ...future.startTime <- base::Sys.time() [15:31:51.533] { [15:31:51.533] { [15:31:51.533] { [15:31:51.533] base::local({ [15:31:51.533] has_future <- base::requireNamespace("future", [15:31:51.533] quietly = TRUE) [15:31:51.533] if (has_future) { [15:31:51.533] ns <- base::getNamespace("future") [15:31:51.533] version <- ns[[".package"]][["version"]] [15:31:51.533] if (is.null(version)) [15:31:51.533] version <- utils::packageVersion("future") [15:31:51.533] } [15:31:51.533] else { [15:31:51.533] version <- NULL [15:31:51.533] } [15:31:51.533] if (!has_future || version < "1.8.0") { [15:31:51.533] info <- base::c(r_version = base::gsub("R version ", [15:31:51.533] "", base::R.version$version.string), [15:31:51.533] platform = base::sprintf("%s (%s-bit)", [15:31:51.533] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:51.533] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:51.533] "release", "version")], collapse = " "), [15:31:51.533] hostname = base::Sys.info()[["nodename"]]) [15:31:51.533] info <- base::sprintf("%s: %s", base::names(info), [15:31:51.533] info) [15:31:51.533] info <- base::paste(info, collapse = "; ") [15:31:51.533] if (!has_future) { [15:31:51.533] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:51.533] info) [15:31:51.533] } [15:31:51.533] else { [15:31:51.533] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:51.533] info, version) [15:31:51.533] } [15:31:51.533] base::stop(msg) [15:31:51.533] } [15:31:51.533] }) [15:31:51.533] } [15:31:51.533] ...future.strategy.old <- future::plan("list") [15:31:51.533] options(future.plan = NULL) [15:31:51.533] Sys.unsetenv("R_FUTURE_PLAN") [15:31:51.533] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:51.533] } [15:31:51.533] ...future.workdir <- getwd() [15:31:51.533] } [15:31:51.533] ...future.oldOptions <- base::as.list(base::.Options) [15:31:51.533] ...future.oldEnvVars <- base::Sys.getenv() [15:31:51.533] } [15:31:51.533] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:51.533] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:51.533] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:51.533] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:51.533] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:51.533] future.stdout.windows.reencode = NULL, width = 80L) [15:31:51.533] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:51.533] base::names(...future.oldOptions)) [15:31:51.533] } [15:31:51.533] if (FALSE) { [15:31:51.533] } [15:31:51.533] else { [15:31:51.533] if (TRUE) { [15:31:51.533] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:51.533] open = "w") [15:31:51.533] } [15:31:51.533] else { [15:31:51.533] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:51.533] windows = "NUL", "/dev/null"), open = "w") [15:31:51.533] } [15:31:51.533] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:51.533] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:51.533] base::sink(type = "output", split = FALSE) [15:31:51.533] base::close(...future.stdout) [15:31:51.533] }, add = TRUE) [15:31:51.533] } [15:31:51.533] ...future.frame <- base::sys.nframe() [15:31:51.533] ...future.conditions <- base::list() [15:31:51.533] ...future.rng <- base::globalenv()$.Random.seed [15:31:51.533] if (FALSE) { [15:31:51.533] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:51.533] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:51.533] } [15:31:51.533] ...future.result <- base::tryCatch({ [15:31:51.533] base::withCallingHandlers({ [15:31:51.533] ...future.value <- base::withVisible(base::local({ [15:31:51.533] do.call(function(...) { [15:31:51.533] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.533] if (!identical(...future.globals.maxSize.org, [15:31:51.533] ...future.globals.maxSize)) { [15:31:51.533] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.533] on.exit(options(oopts), add = TRUE) [15:31:51.533] } [15:31:51.533] { [15:31:51.533] lapply(seq_along(...future.elements_ii), [15:31:51.533] FUN = function(jj) { [15:31:51.533] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.533] ...future.FUN(...future.X_jj, ...) [15:31:51.533] }) [15:31:51.533] } [15:31:51.533] }, args = future.call.arguments) [15:31:51.533] })) [15:31:51.533] future::FutureResult(value = ...future.value$value, [15:31:51.533] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:51.533] ...future.rng), globalenv = if (FALSE) [15:31:51.533] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:51.533] ...future.globalenv.names)) [15:31:51.533] else NULL, started = ...future.startTime, version = "1.8") [15:31:51.533] }, condition = base::local({ [15:31:51.533] c <- base::c [15:31:51.533] inherits <- base::inherits [15:31:51.533] invokeRestart <- base::invokeRestart [15:31:51.533] length <- base::length [15:31:51.533] list <- base::list [15:31:51.533] seq.int <- base::seq.int [15:31:51.533] signalCondition <- base::signalCondition [15:31:51.533] sys.calls <- base::sys.calls [15:31:51.533] `[[` <- base::`[[` [15:31:51.533] `+` <- base::`+` [15:31:51.533] `<<-` <- base::`<<-` [15:31:51.533] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:51.533] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:51.533] 3L)] [15:31:51.533] } [15:31:51.533] function(cond) { [15:31:51.533] is_error <- inherits(cond, "error") [15:31:51.533] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:51.533] NULL) [15:31:51.533] if (is_error) { [15:31:51.533] sessionInformation <- function() { [15:31:51.533] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:51.533] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:51.533] search = base::search(), system = base::Sys.info()) [15:31:51.533] } [15:31:51.533] ...future.conditions[[length(...future.conditions) + [15:31:51.533] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:51.533] cond$call), session = sessionInformation(), [15:31:51.533] timestamp = base::Sys.time(), signaled = 0L) [15:31:51.533] signalCondition(cond) [15:31:51.533] } [15:31:51.533] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:51.533] "immediateCondition"))) { [15:31:51.533] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:51.533] ...future.conditions[[length(...future.conditions) + [15:31:51.533] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:51.533] if (TRUE && !signal) { [15:31:51.533] muffleCondition <- function (cond, pattern = "^muffle") [15:31:51.533] { [15:31:51.533] inherits <- base::inherits [15:31:51.533] invokeRestart <- base::invokeRestart [15:31:51.533] is.null <- base::is.null [15:31:51.533] muffled <- FALSE [15:31:51.533] if (inherits(cond, "message")) { [15:31:51.533] muffled <- grepl(pattern, "muffleMessage") [15:31:51.533] if (muffled) [15:31:51.533] invokeRestart("muffleMessage") [15:31:51.533] } [15:31:51.533] else if (inherits(cond, "warning")) { [15:31:51.533] muffled <- grepl(pattern, "muffleWarning") [15:31:51.533] if (muffled) [15:31:51.533] invokeRestart("muffleWarning") [15:31:51.533] } [15:31:51.533] else if (inherits(cond, "condition")) { [15:31:51.533] if (!is.null(pattern)) { [15:31:51.533] computeRestarts <- base::computeRestarts [15:31:51.533] grepl <- base::grepl [15:31:51.533] restarts <- computeRestarts(cond) [15:31:51.533] for (restart in restarts) { [15:31:51.533] name <- restart$name [15:31:51.533] if (is.null(name)) [15:31:51.533] next [15:31:51.533] if (!grepl(pattern, name)) [15:31:51.533] next [15:31:51.533] invokeRestart(restart) [15:31:51.533] muffled <- TRUE [15:31:51.533] break [15:31:51.533] } [15:31:51.533] } [15:31:51.533] } [15:31:51.533] invisible(muffled) [15:31:51.533] } [15:31:51.533] muffleCondition(cond, pattern = "^muffle") [15:31:51.533] } [15:31:51.533] } [15:31:51.533] else { [15:31:51.533] if (TRUE) { [15:31:51.533] muffleCondition <- function (cond, pattern = "^muffle") [15:31:51.533] { [15:31:51.533] inherits <- base::inherits [15:31:51.533] invokeRestart <- base::invokeRestart [15:31:51.533] is.null <- base::is.null [15:31:51.533] muffled <- FALSE [15:31:51.533] if (inherits(cond, "message")) { [15:31:51.533] muffled <- grepl(pattern, "muffleMessage") [15:31:51.533] if (muffled) [15:31:51.533] invokeRestart("muffleMessage") [15:31:51.533] } [15:31:51.533] else if (inherits(cond, "warning")) { [15:31:51.533] muffled <- grepl(pattern, "muffleWarning") [15:31:51.533] if (muffled) [15:31:51.533] invokeRestart("muffleWarning") [15:31:51.533] } [15:31:51.533] else if (inherits(cond, "condition")) { [15:31:51.533] if (!is.null(pattern)) { [15:31:51.533] computeRestarts <- base::computeRestarts [15:31:51.533] grepl <- base::grepl [15:31:51.533] restarts <- computeRestarts(cond) [15:31:51.533] for (restart in restarts) { [15:31:51.533] name <- restart$name [15:31:51.533] if (is.null(name)) [15:31:51.533] next [15:31:51.533] if (!grepl(pattern, name)) [15:31:51.533] next [15:31:51.533] invokeRestart(restart) [15:31:51.533] muffled <- TRUE [15:31:51.533] break [15:31:51.533] } [15:31:51.533] } [15:31:51.533] } [15:31:51.533] invisible(muffled) [15:31:51.533] } [15:31:51.533] muffleCondition(cond, pattern = "^muffle") [15:31:51.533] } [15:31:51.533] } [15:31:51.533] } [15:31:51.533] })) [15:31:51.533] }, error = function(ex) { [15:31:51.533] base::structure(base::list(value = NULL, visible = NULL, [15:31:51.533] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:51.533] ...future.rng), started = ...future.startTime, [15:31:51.533] finished = Sys.time(), session_uuid = NA_character_, [15:31:51.533] version = "1.8"), class = "FutureResult") [15:31:51.533] }, finally = { [15:31:51.533] if (!identical(...future.workdir, getwd())) [15:31:51.533] setwd(...future.workdir) [15:31:51.533] { [15:31:51.533] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:51.533] ...future.oldOptions$nwarnings <- NULL [15:31:51.533] } [15:31:51.533] base::options(...future.oldOptions) [15:31:51.533] if (.Platform$OS.type == "windows") { [15:31:51.533] old_names <- names(...future.oldEnvVars) [15:31:51.533] envs <- base::Sys.getenv() [15:31:51.533] names <- names(envs) [15:31:51.533] common <- intersect(names, old_names) [15:31:51.533] added <- setdiff(names, old_names) [15:31:51.533] removed <- setdiff(old_names, names) [15:31:51.533] changed <- common[...future.oldEnvVars[common] != [15:31:51.533] envs[common]] [15:31:51.533] NAMES <- toupper(changed) [15:31:51.533] args <- list() [15:31:51.533] for (kk in seq_along(NAMES)) { [15:31:51.533] name <- changed[[kk]] [15:31:51.533] NAME <- NAMES[[kk]] [15:31:51.533] if (name != NAME && is.element(NAME, old_names)) [15:31:51.533] next [15:31:51.533] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:51.533] } [15:31:51.533] NAMES <- toupper(added) [15:31:51.533] for (kk in seq_along(NAMES)) { [15:31:51.533] name <- added[[kk]] [15:31:51.533] NAME <- NAMES[[kk]] [15:31:51.533] if (name != NAME && is.element(NAME, old_names)) [15:31:51.533] next [15:31:51.533] args[[name]] <- "" [15:31:51.533] } [15:31:51.533] NAMES <- toupper(removed) [15:31:51.533] for (kk in seq_along(NAMES)) { [15:31:51.533] name <- removed[[kk]] [15:31:51.533] NAME <- NAMES[[kk]] [15:31:51.533] if (name != NAME && is.element(NAME, old_names)) [15:31:51.533] next [15:31:51.533] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:51.533] } [15:31:51.533] if (length(args) > 0) [15:31:51.533] base::do.call(base::Sys.setenv, args = args) [15:31:51.533] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:51.533] } [15:31:51.533] else { [15:31:51.533] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:51.533] } [15:31:51.533] { [15:31:51.533] if (base::length(...future.futureOptionsAdded) > [15:31:51.533] 0L) { [15:31:51.533] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:51.533] base::names(opts) <- ...future.futureOptionsAdded [15:31:51.533] base::options(opts) [15:31:51.533] } [15:31:51.533] { [15:31:51.533] { [15:31:51.533] NULL [15:31:51.533] RNGkind("Mersenne-Twister") [15:31:51.533] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:51.533] inherits = FALSE) [15:31:51.533] } [15:31:51.533] options(future.plan = NULL) [15:31:51.533] if (is.na(NA_character_)) [15:31:51.533] Sys.unsetenv("R_FUTURE_PLAN") [15:31:51.533] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:51.533] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:51.533] .init = FALSE) [15:31:51.533] } [15:31:51.533] } [15:31:51.533] } [15:31:51.533] }) [15:31:51.533] if (TRUE) { [15:31:51.533] base::sink(type = "output", split = FALSE) [15:31:51.533] if (TRUE) { [15:31:51.533] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:51.533] } [15:31:51.533] else { [15:31:51.533] ...future.result["stdout"] <- base::list(NULL) [15:31:51.533] } [15:31:51.533] base::close(...future.stdout) [15:31:51.533] ...future.stdout <- NULL [15:31:51.533] } [15:31:51.533] ...future.result$conditions <- ...future.conditions [15:31:51.533] ...future.result$finished <- base::Sys.time() [15:31:51.533] ...future.result [15:31:51.533] } [15:31:51.540] assign_globals() ... [15:31:51.540] List of 5 [15:31:51.540] $ ...future.FUN :function (x) [15:31:51.540] $ future.call.arguments : list() [15:31:51.540] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:51.540] $ ...future.elements_ii :List of 2 [15:31:51.540] ..$ a: num 0 [15:31:51.540] ..$ b: num 0 [15:31:51.540] $ ...future.seeds_ii : NULL [15:31:51.540] $ ...future.globals.maxSize: NULL [15:31:51.540] - attr(*, "where")=List of 5 [15:31:51.540] ..$ ...future.FUN : [15:31:51.540] ..$ future.call.arguments : [15:31:51.540] ..$ ...future.elements_ii : [15:31:51.540] ..$ ...future.seeds_ii : [15:31:51.540] ..$ ...future.globals.maxSize: [15:31:51.540] - attr(*, "resolved")= logi FALSE [15:31:51.540] - attr(*, "total_size")= num 848 [15:31:51.540] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:51.540] - attr(*, "already-done")= logi TRUE [15:31:51.550] - copied '...future.FUN' to environment [15:31:51.551] - copied 'future.call.arguments' to environment [15:31:51.551] - copied '...future.elements_ii' to environment [15:31:51.551] - copied '...future.seeds_ii' to environment [15:31:51.552] - copied '...future.globals.maxSize' to environment [15:31:51.552] assign_globals() ... done [15:31:51.552] plan(): Setting new future strategy stack: [15:31:51.553] List of future strategies: [15:31:51.553] 1. sequential: [15:31:51.553] - args: function (..., envir = parent.frame(), workers = "") [15:31:51.553] - tweaked: FALSE [15:31:51.553] - call: NULL [15:31:51.554] plan(): nbrOfWorkers() = 1 [15:31:51.556] plan(): Setting new future strategy stack: [15:31:51.556] List of future strategies: [15:31:51.556] 1. multisession: [15:31:51.556] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:51.556] - tweaked: FALSE [15:31:51.556] - call: plan(strategy) [15:31:51.560] plan(): nbrOfWorkers() = 1 [15:31:51.561] SequentialFuture started (and completed) [15:31:51.561] - Launch lazy future ... done [15:31:51.561] run() for 'SequentialFuture' ... done [15:31:51.562] Created future: [15:31:51.562] SequentialFuture: [15:31:51.562] Label: 'future_lapply-1' [15:31:51.562] Expression: [15:31:51.562] { [15:31:51.562] do.call(function(...) { [15:31:51.562] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.562] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:51.562] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.562] on.exit(options(oopts), add = TRUE) [15:31:51.562] } [15:31:51.562] { [15:31:51.562] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:51.562] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.562] ...future.FUN(...future.X_jj, ...) [15:31:51.562] }) [15:31:51.562] } [15:31:51.562] }, args = future.call.arguments) [15:31:51.562] } [15:31:51.562] Lazy evaluation: FALSE [15:31:51.562] Asynchronous evaluation: FALSE [15:31:51.562] Local evaluation: TRUE [15:31:51.562] Environment: R_GlobalEnv [15:31:51.562] Capture standard output: TRUE [15:31:51.562] Capture condition classes: 'condition' (excluding 'nothing') [15:31:51.562] Globals: 5 objects totaling 960 bytes (function '...future.FUN' of 848 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:51.562] Packages: [15:31:51.562] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:51.562] Resolved: TRUE [15:31:51.562] Value: 112 bytes of class 'list' [15:31:51.562] Early signaling: FALSE [15:31:51.562] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:51.562] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:51.564] Chunk #1 of 1 ... DONE [15:31:51.564] Launching 1 futures (chunks) ... DONE [15:31:51.564] Resolving 1 futures (chunks) ... [15:31:51.565] resolve() on list ... [15:31:51.565] recursive: 0 [15:31:51.565] length: 1 [15:31:51.566] [15:31:51.566] resolved() for 'SequentialFuture' ... [15:31:51.566] - state: 'finished' [15:31:51.566] - run: TRUE [15:31:51.567] - result: 'FutureResult' [15:31:51.567] resolved() for 'SequentialFuture' ... done [15:31:51.567] Future #1 [15:31:51.568] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:51.568] - nx: 1 [15:31:51.568] - relay: TRUE [15:31:51.568] - stdout: TRUE [15:31:51.569] - signal: TRUE [15:31:51.569] - resignal: FALSE [15:31:51.569] - force: TRUE [15:31:51.569] - relayed: [n=1] FALSE [15:31:51.570] - queued futures: [n=1] FALSE [15:31:51.570] - until=1 [15:31:51.570] - relaying element #1 [15:31:51.571] - relayed: [n=1] TRUE [15:31:51.571] - queued futures: [n=1] TRUE [15:31:51.571] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:51.572] length: 0 (resolved future 1) [15:31:51.572] Relaying remaining futures [15:31:51.572] signalConditionsASAP(NULL, pos=0) ... [15:31:51.572] - nx: 1 [15:31:51.573] - relay: TRUE [15:31:51.573] - stdout: TRUE [15:31:51.573] - signal: TRUE [15:31:51.574] - resignal: FALSE [15:31:51.574] - force: TRUE [15:31:51.574] - relayed: [n=1] TRUE [15:31:51.574] - queued futures: [n=1] TRUE - flush all [15:31:51.575] - relayed: [n=1] TRUE [15:31:51.575] - queued futures: [n=1] TRUE [15:31:51.575] signalConditionsASAP(NULL, pos=0) ... done [15:31:51.576] resolve() on list ... DONE [15:31:51.576] - Number of value chunks collected: 1 [15:31:51.576] Resolving 1 futures (chunks) ... DONE [15:31:51.577] Reducing values from 1 chunks ... [15:31:51.577] - Number of values collected after concatenation: 2 [15:31:51.577] - Number of values expected: 2 [15:31:51.578] Reducing values from 1 chunks ... DONE [15:31:51.578] future_lapply() ... DONE Testing with 1 cores ... DONE Testing with 2 cores ... - plan('sequential') ... [15:31:51.579] plan(): Setting new future strategy stack: [15:31:51.579] List of future strategies: [15:31:51.579] 1. sequential: [15:31:51.579] - args: function (..., envir = parent.frame(), workers = "") [15:31:51.579] - tweaked: FALSE [15:31:51.579] - call: plan(strategy) [15:31:51.580] plan(): nbrOfWorkers() = 1 - future_lapply(x, FUN = vector, ...) ... [15:31:51.581] future_lapply() ... [15:31:51.582] Number of chunks: 4 [15:31:51.582] getGlobalsAndPackagesXApply() ... [15:31:51.583] - future.globals: TRUE [15:31:51.583] getGlobalsAndPackages() ... [15:31:51.583] Searching for globals... [15:31:51.585] - globals found: [2] 'FUN', '.Internal' [15:31:51.586] Searching for globals ... DONE [15:31:51.586] Resolving globals: FALSE [15:31:51.587] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:51.588] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:51.588] - globals: [1] 'FUN' [15:31:51.588] [15:31:51.588] getGlobalsAndPackages() ... DONE [15:31:51.589] - globals found/used: [n=1] 'FUN' [15:31:51.589] - needed namespaces: [n=0] [15:31:51.589] Finding globals ... DONE [15:31:51.590] - use_args: TRUE [15:31:51.590] - Getting '...' globals ... [15:31:51.590] resolve() on list ... [15:31:51.591] recursive: 0 [15:31:51.591] length: 1 [15:31:51.591] elements: '...' [15:31:51.592] length: 0 (resolved future 1) [15:31:51.592] resolve() on list ... DONE [15:31:51.592] - '...' content: [n=1] 'length' [15:31:51.592] List of 1 [15:31:51.592] $ ...:List of 1 [15:31:51.592] ..$ length: int 2 [15:31:51.592] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:51.592] - attr(*, "where")=List of 1 [15:31:51.592] ..$ ...: [15:31:51.592] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:51.592] - attr(*, "resolved")= logi TRUE [15:31:51.592] - attr(*, "total_size")= num NA [15:31:51.602] - Getting '...' globals ... DONE [15:31:51.603] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:51.603] List of 2 [15:31:51.603] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:51.603] $ ... :List of 1 [15:31:51.603] ..$ length: int 2 [15:31:51.603] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:51.603] - attr(*, "where")=List of 2 [15:31:51.603] ..$ ...future.FUN: [15:31:51.603] ..$ ... : [15:31:51.603] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:51.603] - attr(*, "resolved")= logi FALSE [15:31:51.603] - attr(*, "total_size")= num 2240 [15:31:51.609] Packages to be attached in all futures: [n=0] [15:31:51.610] getGlobalsAndPackagesXApply() ... DONE [15:31:51.610] Number of futures (= number of chunks): 4 [15:31:51.610] Launching 4 futures (chunks) ... [15:31:51.611] Chunk #1 of 4 ... [15:31:51.611] - Finding globals in 'X' for chunk #1 ... [15:31:51.611] getGlobalsAndPackages() ... [15:31:51.611] Searching for globals... [15:31:51.612] [15:31:51.612] Searching for globals ... DONE [15:31:51.612] - globals: [0] [15:31:51.613] getGlobalsAndPackages() ... DONE [15:31:51.613] + additional globals found: [n=0] [15:31:51.613] + additional namespaces needed: [n=0] [15:31:51.613] - Finding globals in 'X' for chunk #1 ... DONE [15:31:51.614] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:51.614] - seeds: [15:31:51.614] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.614] getGlobalsAndPackages() ... [15:31:51.615] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.615] Resolving globals: FALSE [15:31:51.615] Tweak future expression to call with '...' arguments ... [15:31:51.616] { [15:31:51.616] do.call(function(...) { [15:31:51.616] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.616] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:51.616] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.616] on.exit(options(oopts), add = TRUE) [15:31:51.616] } [15:31:51.616] { [15:31:51.616] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:51.616] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.616] ...future.FUN(...future.X_jj, ...) [15:31:51.616] }) [15:31:51.616] } [15:31:51.616] }, args = future.call.arguments) [15:31:51.616] } [15:31:51.617] Tweak future expression to call with '...' arguments ... DONE [15:31:51.617] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.618] [15:31:51.618] getGlobalsAndPackages() ... DONE [15:31:51.618] run() for 'Future' ... [15:31:51.619] - state: 'created' [15:31:51.619] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:51.620] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:51.620] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:51.620] - Field: 'label' [15:31:51.621] - Field: 'local' [15:31:51.621] - Field: 'owner' [15:31:51.621] - Field: 'envir' [15:31:51.621] - Field: 'packages' [15:31:51.622] - Field: 'gc' [15:31:51.622] - Field: 'conditions' [15:31:51.622] - Field: 'expr' [15:31:51.623] - Field: 'uuid' [15:31:51.623] - Field: 'seed' [15:31:51.623] - Field: 'version' [15:31:51.623] - Field: 'result' [15:31:51.624] - Field: 'asynchronous' [15:31:51.624] - Field: 'calls' [15:31:51.624] - Field: 'globals' [15:31:51.625] - Field: 'stdout' [15:31:51.625] - Field: 'earlySignal' [15:31:51.625] - Field: 'lazy' [15:31:51.626] - Field: 'state' [15:31:51.626] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:51.626] - Launch lazy future ... [15:31:51.627] Packages needed by the future expression (n = 0): [15:31:51.627] Packages needed by future strategies (n = 0): [15:31:51.628] { [15:31:51.628] { [15:31:51.628] { [15:31:51.628] ...future.startTime <- base::Sys.time() [15:31:51.628] { [15:31:51.628] { [15:31:51.628] { [15:31:51.628] base::local({ [15:31:51.628] has_future <- base::requireNamespace("future", [15:31:51.628] quietly = TRUE) [15:31:51.628] if (has_future) { [15:31:51.628] ns <- base::getNamespace("future") [15:31:51.628] version <- ns[[".package"]][["version"]] [15:31:51.628] if (is.null(version)) [15:31:51.628] version <- utils::packageVersion("future") [15:31:51.628] } [15:31:51.628] else { [15:31:51.628] version <- NULL [15:31:51.628] } [15:31:51.628] if (!has_future || version < "1.8.0") { [15:31:51.628] info <- base::c(r_version = base::gsub("R version ", [15:31:51.628] "", base::R.version$version.string), [15:31:51.628] platform = base::sprintf("%s (%s-bit)", [15:31:51.628] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:51.628] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:51.628] "release", "version")], collapse = " "), [15:31:51.628] hostname = base::Sys.info()[["nodename"]]) [15:31:51.628] info <- base::sprintf("%s: %s", base::names(info), [15:31:51.628] info) [15:31:51.628] info <- base::paste(info, collapse = "; ") [15:31:51.628] if (!has_future) { [15:31:51.628] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:51.628] info) [15:31:51.628] } [15:31:51.628] else { [15:31:51.628] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:51.628] info, version) [15:31:51.628] } [15:31:51.628] base::stop(msg) [15:31:51.628] } [15:31:51.628] }) [15:31:51.628] } [15:31:51.628] ...future.strategy.old <- future::plan("list") [15:31:51.628] options(future.plan = NULL) [15:31:51.628] Sys.unsetenv("R_FUTURE_PLAN") [15:31:51.628] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:51.628] } [15:31:51.628] ...future.workdir <- getwd() [15:31:51.628] } [15:31:51.628] ...future.oldOptions <- base::as.list(base::.Options) [15:31:51.628] ...future.oldEnvVars <- base::Sys.getenv() [15:31:51.628] } [15:31:51.628] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:51.628] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:51.628] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:51.628] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:51.628] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:51.628] future.stdout.windows.reencode = NULL, width = 80L) [15:31:51.628] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:51.628] base::names(...future.oldOptions)) [15:31:51.628] } [15:31:51.628] if (FALSE) { [15:31:51.628] } [15:31:51.628] else { [15:31:51.628] if (TRUE) { [15:31:51.628] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:51.628] open = "w") [15:31:51.628] } [15:31:51.628] else { [15:31:51.628] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:51.628] windows = "NUL", "/dev/null"), open = "w") [15:31:51.628] } [15:31:51.628] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:51.628] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:51.628] base::sink(type = "output", split = FALSE) [15:31:51.628] base::close(...future.stdout) [15:31:51.628] }, add = TRUE) [15:31:51.628] } [15:31:51.628] ...future.frame <- base::sys.nframe() [15:31:51.628] ...future.conditions <- base::list() [15:31:51.628] ...future.rng <- base::globalenv()$.Random.seed [15:31:51.628] if (FALSE) { [15:31:51.628] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:51.628] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:51.628] } [15:31:51.628] ...future.result <- base::tryCatch({ [15:31:51.628] base::withCallingHandlers({ [15:31:51.628] ...future.value <- base::withVisible(base::local({ [15:31:51.628] do.call(function(...) { [15:31:51.628] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.628] if (!identical(...future.globals.maxSize.org, [15:31:51.628] ...future.globals.maxSize)) { [15:31:51.628] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.628] on.exit(options(oopts), add = TRUE) [15:31:51.628] } [15:31:51.628] { [15:31:51.628] lapply(seq_along(...future.elements_ii), [15:31:51.628] FUN = function(jj) { [15:31:51.628] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.628] ...future.FUN(...future.X_jj, ...) [15:31:51.628] }) [15:31:51.628] } [15:31:51.628] }, args = future.call.arguments) [15:31:51.628] })) [15:31:51.628] future::FutureResult(value = ...future.value$value, [15:31:51.628] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:51.628] ...future.rng), globalenv = if (FALSE) [15:31:51.628] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:51.628] ...future.globalenv.names)) [15:31:51.628] else NULL, started = ...future.startTime, version = "1.8") [15:31:51.628] }, condition = base::local({ [15:31:51.628] c <- base::c [15:31:51.628] inherits <- base::inherits [15:31:51.628] invokeRestart <- base::invokeRestart [15:31:51.628] length <- base::length [15:31:51.628] list <- base::list [15:31:51.628] seq.int <- base::seq.int [15:31:51.628] signalCondition <- base::signalCondition [15:31:51.628] sys.calls <- base::sys.calls [15:31:51.628] `[[` <- base::`[[` [15:31:51.628] `+` <- base::`+` [15:31:51.628] `<<-` <- base::`<<-` [15:31:51.628] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:51.628] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:51.628] 3L)] [15:31:51.628] } [15:31:51.628] function(cond) { [15:31:51.628] is_error <- inherits(cond, "error") [15:31:51.628] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:51.628] NULL) [15:31:51.628] if (is_error) { [15:31:51.628] sessionInformation <- function() { [15:31:51.628] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:51.628] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:51.628] search = base::search(), system = base::Sys.info()) [15:31:51.628] } [15:31:51.628] ...future.conditions[[length(...future.conditions) + [15:31:51.628] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:51.628] cond$call), session = sessionInformation(), [15:31:51.628] timestamp = base::Sys.time(), signaled = 0L) [15:31:51.628] signalCondition(cond) [15:31:51.628] } [15:31:51.628] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:51.628] "immediateCondition"))) { [15:31:51.628] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:51.628] ...future.conditions[[length(...future.conditions) + [15:31:51.628] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:51.628] if (TRUE && !signal) { [15:31:51.628] muffleCondition <- function (cond, pattern = "^muffle") [15:31:51.628] { [15:31:51.628] inherits <- base::inherits [15:31:51.628] invokeRestart <- base::invokeRestart [15:31:51.628] is.null <- base::is.null [15:31:51.628] muffled <- FALSE [15:31:51.628] if (inherits(cond, "message")) { [15:31:51.628] muffled <- grepl(pattern, "muffleMessage") [15:31:51.628] if (muffled) [15:31:51.628] invokeRestart("muffleMessage") [15:31:51.628] } [15:31:51.628] else if (inherits(cond, "warning")) { [15:31:51.628] muffled <- grepl(pattern, "muffleWarning") [15:31:51.628] if (muffled) [15:31:51.628] invokeRestart("muffleWarning") [15:31:51.628] } [15:31:51.628] else if (inherits(cond, "condition")) { [15:31:51.628] if (!is.null(pattern)) { [15:31:51.628] computeRestarts <- base::computeRestarts [15:31:51.628] grepl <- base::grepl [15:31:51.628] restarts <- computeRestarts(cond) [15:31:51.628] for (restart in restarts) { [15:31:51.628] name <- restart$name [15:31:51.628] if (is.null(name)) [15:31:51.628] next [15:31:51.628] if (!grepl(pattern, name)) [15:31:51.628] next [15:31:51.628] invokeRestart(restart) [15:31:51.628] muffled <- TRUE [15:31:51.628] break [15:31:51.628] } [15:31:51.628] } [15:31:51.628] } [15:31:51.628] invisible(muffled) [15:31:51.628] } [15:31:51.628] muffleCondition(cond, pattern = "^muffle") [15:31:51.628] } [15:31:51.628] } [15:31:51.628] else { [15:31:51.628] if (TRUE) { [15:31:51.628] muffleCondition <- function (cond, pattern = "^muffle") [15:31:51.628] { [15:31:51.628] inherits <- base::inherits [15:31:51.628] invokeRestart <- base::invokeRestart [15:31:51.628] is.null <- base::is.null [15:31:51.628] muffled <- FALSE [15:31:51.628] if (inherits(cond, "message")) { [15:31:51.628] muffled <- grepl(pattern, "muffleMessage") [15:31:51.628] if (muffled) [15:31:51.628] invokeRestart("muffleMessage") [15:31:51.628] } [15:31:51.628] else if (inherits(cond, "warning")) { [15:31:51.628] muffled <- grepl(pattern, "muffleWarning") [15:31:51.628] if (muffled) [15:31:51.628] invokeRestart("muffleWarning") [15:31:51.628] } [15:31:51.628] else if (inherits(cond, "condition")) { [15:31:51.628] if (!is.null(pattern)) { [15:31:51.628] computeRestarts <- base::computeRestarts [15:31:51.628] grepl <- base::grepl [15:31:51.628] restarts <- computeRestarts(cond) [15:31:51.628] for (restart in restarts) { [15:31:51.628] name <- restart$name [15:31:51.628] if (is.null(name)) [15:31:51.628] next [15:31:51.628] if (!grepl(pattern, name)) [15:31:51.628] next [15:31:51.628] invokeRestart(restart) [15:31:51.628] muffled <- TRUE [15:31:51.628] break [15:31:51.628] } [15:31:51.628] } [15:31:51.628] } [15:31:51.628] invisible(muffled) [15:31:51.628] } [15:31:51.628] muffleCondition(cond, pattern = "^muffle") [15:31:51.628] } [15:31:51.628] } [15:31:51.628] } [15:31:51.628] })) [15:31:51.628] }, error = function(ex) { [15:31:51.628] base::structure(base::list(value = NULL, visible = NULL, [15:31:51.628] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:51.628] ...future.rng), started = ...future.startTime, [15:31:51.628] finished = Sys.time(), session_uuid = NA_character_, [15:31:51.628] version = "1.8"), class = "FutureResult") [15:31:51.628] }, finally = { [15:31:51.628] if (!identical(...future.workdir, getwd())) [15:31:51.628] setwd(...future.workdir) [15:31:51.628] { [15:31:51.628] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:51.628] ...future.oldOptions$nwarnings <- NULL [15:31:51.628] } [15:31:51.628] base::options(...future.oldOptions) [15:31:51.628] if (.Platform$OS.type == "windows") { [15:31:51.628] old_names <- names(...future.oldEnvVars) [15:31:51.628] envs <- base::Sys.getenv() [15:31:51.628] names <- names(envs) [15:31:51.628] common <- intersect(names, old_names) [15:31:51.628] added <- setdiff(names, old_names) [15:31:51.628] removed <- setdiff(old_names, names) [15:31:51.628] changed <- common[...future.oldEnvVars[common] != [15:31:51.628] envs[common]] [15:31:51.628] NAMES <- toupper(changed) [15:31:51.628] args <- list() [15:31:51.628] for (kk in seq_along(NAMES)) { [15:31:51.628] name <- changed[[kk]] [15:31:51.628] NAME <- NAMES[[kk]] [15:31:51.628] if (name != NAME && is.element(NAME, old_names)) [15:31:51.628] next [15:31:51.628] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:51.628] } [15:31:51.628] NAMES <- toupper(added) [15:31:51.628] for (kk in seq_along(NAMES)) { [15:31:51.628] name <- added[[kk]] [15:31:51.628] NAME <- NAMES[[kk]] [15:31:51.628] if (name != NAME && is.element(NAME, old_names)) [15:31:51.628] next [15:31:51.628] args[[name]] <- "" [15:31:51.628] } [15:31:51.628] NAMES <- toupper(removed) [15:31:51.628] for (kk in seq_along(NAMES)) { [15:31:51.628] name <- removed[[kk]] [15:31:51.628] NAME <- NAMES[[kk]] [15:31:51.628] if (name != NAME && is.element(NAME, old_names)) [15:31:51.628] next [15:31:51.628] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:51.628] } [15:31:51.628] if (length(args) > 0) [15:31:51.628] base::do.call(base::Sys.setenv, args = args) [15:31:51.628] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:51.628] } [15:31:51.628] else { [15:31:51.628] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:51.628] } [15:31:51.628] { [15:31:51.628] if (base::length(...future.futureOptionsAdded) > [15:31:51.628] 0L) { [15:31:51.628] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:51.628] base::names(opts) <- ...future.futureOptionsAdded [15:31:51.628] base::options(opts) [15:31:51.628] } [15:31:51.628] { [15:31:51.628] { [15:31:51.628] NULL [15:31:51.628] RNGkind("Mersenne-Twister") [15:31:51.628] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:51.628] inherits = FALSE) [15:31:51.628] } [15:31:51.628] options(future.plan = NULL) [15:31:51.628] if (is.na(NA_character_)) [15:31:51.628] Sys.unsetenv("R_FUTURE_PLAN") [15:31:51.628] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:51.628] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:51.628] .init = FALSE) [15:31:51.628] } [15:31:51.628] } [15:31:51.628] } [15:31:51.628] }) [15:31:51.628] if (TRUE) { [15:31:51.628] base::sink(type = "output", split = FALSE) [15:31:51.628] if (TRUE) { [15:31:51.628] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:51.628] } [15:31:51.628] else { [15:31:51.628] ...future.result["stdout"] <- base::list(NULL) [15:31:51.628] } [15:31:51.628] base::close(...future.stdout) [15:31:51.628] ...future.stdout <- NULL [15:31:51.628] } [15:31:51.628] ...future.result$conditions <- ...future.conditions [15:31:51.628] ...future.result$finished <- base::Sys.time() [15:31:51.628] ...future.result [15:31:51.628] } [15:31:51.634] assign_globals() ... [15:31:51.634] List of 5 [15:31:51.634] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:51.634] $ future.call.arguments :List of 1 [15:31:51.634] ..$ length: int 2 [15:31:51.634] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:51.634] $ ...future.elements_ii :List of 1 [15:31:51.634] ..$ a: chr "integer" [15:31:51.634] $ ...future.seeds_ii : NULL [15:31:51.634] $ ...future.globals.maxSize: NULL [15:31:51.634] - attr(*, "where")=List of 5 [15:31:51.634] ..$ ...future.FUN : [15:31:51.634] ..$ future.call.arguments : [15:31:51.634] ..$ ...future.elements_ii : [15:31:51.634] ..$ ...future.seeds_ii : [15:31:51.634] ..$ ...future.globals.maxSize: [15:31:51.634] - attr(*, "resolved")= logi FALSE [15:31:51.634] - attr(*, "total_size")= num 2240 [15:31:51.634] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:51.634] - attr(*, "already-done")= logi TRUE [15:31:51.644] - copied '...future.FUN' to environment [15:31:51.645] - copied 'future.call.arguments' to environment [15:31:51.645] - copied '...future.elements_ii' to environment [15:31:51.645] - copied '...future.seeds_ii' to environment [15:31:51.646] - copied '...future.globals.maxSize' to environment [15:31:51.646] assign_globals() ... done [15:31:51.648] plan(): Setting new future strategy stack: [15:31:51.648] List of future strategies: [15:31:51.648] 1. sequential: [15:31:51.648] - args: function (..., envir = parent.frame(), workers = "") [15:31:51.648] - tweaked: FALSE [15:31:51.648] - call: NULL [15:31:51.650] plan(): nbrOfWorkers() = 1 [15:31:51.652] plan(): Setting new future strategy stack: [15:31:51.652] List of future strategies: [15:31:51.652] 1. sequential: [15:31:51.652] - args: function (..., envir = parent.frame(), workers = "") [15:31:51.652] - tweaked: FALSE [15:31:51.652] - call: plan(strategy) [15:31:51.653] plan(): nbrOfWorkers() = 1 [15:31:51.654] SequentialFuture started (and completed) [15:31:51.654] - Launch lazy future ... done [15:31:51.655] run() for 'SequentialFuture' ... done [15:31:51.655] Created future: [15:31:51.655] SequentialFuture: [15:31:51.655] Label: 'future_lapply-1' [15:31:51.655] Expression: [15:31:51.655] { [15:31:51.655] do.call(function(...) { [15:31:51.655] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.655] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:51.655] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.655] on.exit(options(oopts), add = TRUE) [15:31:51.655] } [15:31:51.655] { [15:31:51.655] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:51.655] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.655] ...future.FUN(...future.X_jj, ...) [15:31:51.655] }) [15:31:51.655] } [15:31:51.655] }, args = future.call.arguments) [15:31:51.655] } [15:31:51.655] Lazy evaluation: FALSE [15:31:51.655] Asynchronous evaluation: FALSE [15:31:51.655] Local evaluation: TRUE [15:31:51.655] Environment: R_GlobalEnv [15:31:51.655] Capture standard output: TRUE [15:31:51.655] Capture condition classes: 'condition' (excluding 'nothing') [15:31:51.655] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:51.655] Packages: [15:31:51.655] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:51.655] Resolved: TRUE [15:31:51.655] Value: 56 bytes of class 'list' [15:31:51.655] Early signaling: FALSE [15:31:51.655] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:51.655] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:51.657] Chunk #1 of 4 ... DONE [15:31:51.658] Chunk #2 of 4 ... [15:31:51.658] - Finding globals in 'X' for chunk #2 ... [15:31:51.658] getGlobalsAndPackages() ... [15:31:51.659] Searching for globals... [15:31:51.659] [15:31:51.659] Searching for globals ... DONE [15:31:51.660] - globals: [0] [15:31:51.660] getGlobalsAndPackages() ... DONE [15:31:51.660] + additional globals found: [n=0] [15:31:51.660] + additional namespaces needed: [n=0] [15:31:51.661] - Finding globals in 'X' for chunk #2 ... DONE [15:31:51.661] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:51.662] - seeds: [15:31:51.662] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.663] getGlobalsAndPackages() ... [15:31:51.663] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.664] Resolving globals: FALSE [15:31:51.664] Tweak future expression to call with '...' arguments ... [15:31:51.665] { [15:31:51.665] do.call(function(...) { [15:31:51.665] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.665] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:51.665] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.665] on.exit(options(oopts), add = TRUE) [15:31:51.665] } [15:31:51.665] { [15:31:51.665] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:51.665] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.665] ...future.FUN(...future.X_jj, ...) [15:31:51.665] }) [15:31:51.665] } [15:31:51.665] }, args = future.call.arguments) [15:31:51.665] } [15:31:51.666] Tweak future expression to call with '...' arguments ... DONE [15:31:51.667] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.667] [15:31:51.668] getGlobalsAndPackages() ... DONE [15:31:51.668] run() for 'Future' ... [15:31:51.669] - state: 'created' [15:31:51.669] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:51.670] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:51.671] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:51.671] - Field: 'label' [15:31:51.671] - Field: 'local' [15:31:51.672] - Field: 'owner' [15:31:51.672] - Field: 'envir' [15:31:51.672] - Field: 'packages' [15:31:51.672] - Field: 'gc' [15:31:51.673] - Field: 'conditions' [15:31:51.673] - Field: 'expr' [15:31:51.673] - Field: 'uuid' [15:31:51.673] - Field: 'seed' [15:31:51.674] - Field: 'version' [15:31:51.674] - Field: 'result' [15:31:51.674] - Field: 'asynchronous' [15:31:51.674] - Field: 'calls' [15:31:51.675] - Field: 'globals' [15:31:51.675] - Field: 'stdout' [15:31:51.676] - Field: 'earlySignal' [15:31:51.676] - Field: 'lazy' [15:31:51.676] - Field: 'state' [15:31:51.676] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:51.677] - Launch lazy future ... [15:31:51.677] Packages needed by the future expression (n = 0): [15:31:51.678] Packages needed by future strategies (n = 0): [15:31:51.679] { [15:31:51.679] { [15:31:51.679] { [15:31:51.679] ...future.startTime <- base::Sys.time() [15:31:51.679] { [15:31:51.679] { [15:31:51.679] { [15:31:51.679] base::local({ [15:31:51.679] has_future <- base::requireNamespace("future", [15:31:51.679] quietly = TRUE) [15:31:51.679] if (has_future) { [15:31:51.679] ns <- base::getNamespace("future") [15:31:51.679] version <- ns[[".package"]][["version"]] [15:31:51.679] if (is.null(version)) [15:31:51.679] version <- utils::packageVersion("future") [15:31:51.679] } [15:31:51.679] else { [15:31:51.679] version <- NULL [15:31:51.679] } [15:31:51.679] if (!has_future || version < "1.8.0") { [15:31:51.679] info <- base::c(r_version = base::gsub("R version ", [15:31:51.679] "", base::R.version$version.string), [15:31:51.679] platform = base::sprintf("%s (%s-bit)", [15:31:51.679] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:51.679] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:51.679] "release", "version")], collapse = " "), [15:31:51.679] hostname = base::Sys.info()[["nodename"]]) [15:31:51.679] info <- base::sprintf("%s: %s", base::names(info), [15:31:51.679] info) [15:31:51.679] info <- base::paste(info, collapse = "; ") [15:31:51.679] if (!has_future) { [15:31:51.679] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:51.679] info) [15:31:51.679] } [15:31:51.679] else { [15:31:51.679] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:51.679] info, version) [15:31:51.679] } [15:31:51.679] base::stop(msg) [15:31:51.679] } [15:31:51.679] }) [15:31:51.679] } [15:31:51.679] ...future.strategy.old <- future::plan("list") [15:31:51.679] options(future.plan = NULL) [15:31:51.679] Sys.unsetenv("R_FUTURE_PLAN") [15:31:51.679] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:51.679] } [15:31:51.679] ...future.workdir <- getwd() [15:31:51.679] } [15:31:51.679] ...future.oldOptions <- base::as.list(base::.Options) [15:31:51.679] ...future.oldEnvVars <- base::Sys.getenv() [15:31:51.679] } [15:31:51.679] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:51.679] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:51.679] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:51.679] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:51.679] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:51.679] future.stdout.windows.reencode = NULL, width = 80L) [15:31:51.679] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:51.679] base::names(...future.oldOptions)) [15:31:51.679] } [15:31:51.679] if (FALSE) { [15:31:51.679] } [15:31:51.679] else { [15:31:51.679] if (TRUE) { [15:31:51.679] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:51.679] open = "w") [15:31:51.679] } [15:31:51.679] else { [15:31:51.679] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:51.679] windows = "NUL", "/dev/null"), open = "w") [15:31:51.679] } [15:31:51.679] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:51.679] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:51.679] base::sink(type = "output", split = FALSE) [15:31:51.679] base::close(...future.stdout) [15:31:51.679] }, add = TRUE) [15:31:51.679] } [15:31:51.679] ...future.frame <- base::sys.nframe() [15:31:51.679] ...future.conditions <- base::list() [15:31:51.679] ...future.rng <- base::globalenv()$.Random.seed [15:31:51.679] if (FALSE) { [15:31:51.679] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:51.679] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:51.679] } [15:31:51.679] ...future.result <- base::tryCatch({ [15:31:51.679] base::withCallingHandlers({ [15:31:51.679] ...future.value <- base::withVisible(base::local({ [15:31:51.679] do.call(function(...) { [15:31:51.679] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.679] if (!identical(...future.globals.maxSize.org, [15:31:51.679] ...future.globals.maxSize)) { [15:31:51.679] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.679] on.exit(options(oopts), add = TRUE) [15:31:51.679] } [15:31:51.679] { [15:31:51.679] lapply(seq_along(...future.elements_ii), [15:31:51.679] FUN = function(jj) { [15:31:51.679] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.679] ...future.FUN(...future.X_jj, ...) [15:31:51.679] }) [15:31:51.679] } [15:31:51.679] }, args = future.call.arguments) [15:31:51.679] })) [15:31:51.679] future::FutureResult(value = ...future.value$value, [15:31:51.679] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:51.679] ...future.rng), globalenv = if (FALSE) [15:31:51.679] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:51.679] ...future.globalenv.names)) [15:31:51.679] else NULL, started = ...future.startTime, version = "1.8") [15:31:51.679] }, condition = base::local({ [15:31:51.679] c <- base::c [15:31:51.679] inherits <- base::inherits [15:31:51.679] invokeRestart <- base::invokeRestart [15:31:51.679] length <- base::length [15:31:51.679] list <- base::list [15:31:51.679] seq.int <- base::seq.int [15:31:51.679] signalCondition <- base::signalCondition [15:31:51.679] sys.calls <- base::sys.calls [15:31:51.679] `[[` <- base::`[[` [15:31:51.679] `+` <- base::`+` [15:31:51.679] `<<-` <- base::`<<-` [15:31:51.679] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:51.679] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:51.679] 3L)] [15:31:51.679] } [15:31:51.679] function(cond) { [15:31:51.679] is_error <- inherits(cond, "error") [15:31:51.679] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:51.679] NULL) [15:31:51.679] if (is_error) { [15:31:51.679] sessionInformation <- function() { [15:31:51.679] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:51.679] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:51.679] search = base::search(), system = base::Sys.info()) [15:31:51.679] } [15:31:51.679] ...future.conditions[[length(...future.conditions) + [15:31:51.679] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:51.679] cond$call), session = sessionInformation(), [15:31:51.679] timestamp = base::Sys.time(), signaled = 0L) [15:31:51.679] signalCondition(cond) [15:31:51.679] } [15:31:51.679] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:51.679] "immediateCondition"))) { [15:31:51.679] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:51.679] ...future.conditions[[length(...future.conditions) + [15:31:51.679] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:51.679] if (TRUE && !signal) { [15:31:51.679] muffleCondition <- function (cond, pattern = "^muffle") [15:31:51.679] { [15:31:51.679] inherits <- base::inherits [15:31:51.679] invokeRestart <- base::invokeRestart [15:31:51.679] is.null <- base::is.null [15:31:51.679] muffled <- FALSE [15:31:51.679] if (inherits(cond, "message")) { [15:31:51.679] muffled <- grepl(pattern, "muffleMessage") [15:31:51.679] if (muffled) [15:31:51.679] invokeRestart("muffleMessage") [15:31:51.679] } [15:31:51.679] else if (inherits(cond, "warning")) { [15:31:51.679] muffled <- grepl(pattern, "muffleWarning") [15:31:51.679] if (muffled) [15:31:51.679] invokeRestart("muffleWarning") [15:31:51.679] } [15:31:51.679] else if (inherits(cond, "condition")) { [15:31:51.679] if (!is.null(pattern)) { [15:31:51.679] computeRestarts <- base::computeRestarts [15:31:51.679] grepl <- base::grepl [15:31:51.679] restarts <- computeRestarts(cond) [15:31:51.679] for (restart in restarts) { [15:31:51.679] name <- restart$name [15:31:51.679] if (is.null(name)) [15:31:51.679] next [15:31:51.679] if (!grepl(pattern, name)) [15:31:51.679] next [15:31:51.679] invokeRestart(restart) [15:31:51.679] muffled <- TRUE [15:31:51.679] break [15:31:51.679] } [15:31:51.679] } [15:31:51.679] } [15:31:51.679] invisible(muffled) [15:31:51.679] } [15:31:51.679] muffleCondition(cond, pattern = "^muffle") [15:31:51.679] } [15:31:51.679] } [15:31:51.679] else { [15:31:51.679] if (TRUE) { [15:31:51.679] muffleCondition <- function (cond, pattern = "^muffle") [15:31:51.679] { [15:31:51.679] inherits <- base::inherits [15:31:51.679] invokeRestart <- base::invokeRestart [15:31:51.679] is.null <- base::is.null [15:31:51.679] muffled <- FALSE [15:31:51.679] if (inherits(cond, "message")) { [15:31:51.679] muffled <- grepl(pattern, "muffleMessage") [15:31:51.679] if (muffled) [15:31:51.679] invokeRestart("muffleMessage") [15:31:51.679] } [15:31:51.679] else if (inherits(cond, "warning")) { [15:31:51.679] muffled <- grepl(pattern, "muffleWarning") [15:31:51.679] if (muffled) [15:31:51.679] invokeRestart("muffleWarning") [15:31:51.679] } [15:31:51.679] else if (inherits(cond, "condition")) { [15:31:51.679] if (!is.null(pattern)) { [15:31:51.679] computeRestarts <- base::computeRestarts [15:31:51.679] grepl <- base::grepl [15:31:51.679] restarts <- computeRestarts(cond) [15:31:51.679] for (restart in restarts) { [15:31:51.679] name <- restart$name [15:31:51.679] if (is.null(name)) [15:31:51.679] next [15:31:51.679] if (!grepl(pattern, name)) [15:31:51.679] next [15:31:51.679] invokeRestart(restart) [15:31:51.679] muffled <- TRUE [15:31:51.679] break [15:31:51.679] } [15:31:51.679] } [15:31:51.679] } [15:31:51.679] invisible(muffled) [15:31:51.679] } [15:31:51.679] muffleCondition(cond, pattern = "^muffle") [15:31:51.679] } [15:31:51.679] } [15:31:51.679] } [15:31:51.679] })) [15:31:51.679] }, error = function(ex) { [15:31:51.679] base::structure(base::list(value = NULL, visible = NULL, [15:31:51.679] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:51.679] ...future.rng), started = ...future.startTime, [15:31:51.679] finished = Sys.time(), session_uuid = NA_character_, [15:31:51.679] version = "1.8"), class = "FutureResult") [15:31:51.679] }, finally = { [15:31:51.679] if (!identical(...future.workdir, getwd())) [15:31:51.679] setwd(...future.workdir) [15:31:51.679] { [15:31:51.679] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:51.679] ...future.oldOptions$nwarnings <- NULL [15:31:51.679] } [15:31:51.679] base::options(...future.oldOptions) [15:31:51.679] if (.Platform$OS.type == "windows") { [15:31:51.679] old_names <- names(...future.oldEnvVars) [15:31:51.679] envs <- base::Sys.getenv() [15:31:51.679] names <- names(envs) [15:31:51.679] common <- intersect(names, old_names) [15:31:51.679] added <- setdiff(names, old_names) [15:31:51.679] removed <- setdiff(old_names, names) [15:31:51.679] changed <- common[...future.oldEnvVars[common] != [15:31:51.679] envs[common]] [15:31:51.679] NAMES <- toupper(changed) [15:31:51.679] args <- list() [15:31:51.679] for (kk in seq_along(NAMES)) { [15:31:51.679] name <- changed[[kk]] [15:31:51.679] NAME <- NAMES[[kk]] [15:31:51.679] if (name != NAME && is.element(NAME, old_names)) [15:31:51.679] next [15:31:51.679] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:51.679] } [15:31:51.679] NAMES <- toupper(added) [15:31:51.679] for (kk in seq_along(NAMES)) { [15:31:51.679] name <- added[[kk]] [15:31:51.679] NAME <- NAMES[[kk]] [15:31:51.679] if (name != NAME && is.element(NAME, old_names)) [15:31:51.679] next [15:31:51.679] args[[name]] <- "" [15:31:51.679] } [15:31:51.679] NAMES <- toupper(removed) [15:31:51.679] for (kk in seq_along(NAMES)) { [15:31:51.679] name <- removed[[kk]] [15:31:51.679] NAME <- NAMES[[kk]] [15:31:51.679] if (name != NAME && is.element(NAME, old_names)) [15:31:51.679] next [15:31:51.679] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:51.679] } [15:31:51.679] if (length(args) > 0) [15:31:51.679] base::do.call(base::Sys.setenv, args = args) [15:31:51.679] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:51.679] } [15:31:51.679] else { [15:31:51.679] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:51.679] } [15:31:51.679] { [15:31:51.679] if (base::length(...future.futureOptionsAdded) > [15:31:51.679] 0L) { [15:31:51.679] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:51.679] base::names(opts) <- ...future.futureOptionsAdded [15:31:51.679] base::options(opts) [15:31:51.679] } [15:31:51.679] { [15:31:51.679] { [15:31:51.679] NULL [15:31:51.679] RNGkind("Mersenne-Twister") [15:31:51.679] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:51.679] inherits = FALSE) [15:31:51.679] } [15:31:51.679] options(future.plan = NULL) [15:31:51.679] if (is.na(NA_character_)) [15:31:51.679] Sys.unsetenv("R_FUTURE_PLAN") [15:31:51.679] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:51.679] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:51.679] .init = FALSE) [15:31:51.679] } [15:31:51.679] } [15:31:51.679] } [15:31:51.679] }) [15:31:51.679] if (TRUE) { [15:31:51.679] base::sink(type = "output", split = FALSE) [15:31:51.679] if (TRUE) { [15:31:51.679] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:51.679] } [15:31:51.679] else { [15:31:51.679] ...future.result["stdout"] <- base::list(NULL) [15:31:51.679] } [15:31:51.679] base::close(...future.stdout) [15:31:51.679] ...future.stdout <- NULL [15:31:51.679] } [15:31:51.679] ...future.result$conditions <- ...future.conditions [15:31:51.679] ...future.result$finished <- base::Sys.time() [15:31:51.679] ...future.result [15:31:51.679] } [15:31:51.686] assign_globals() ... [15:31:51.686] List of 5 [15:31:51.686] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:51.686] $ future.call.arguments :List of 1 [15:31:51.686] ..$ length: int 2 [15:31:51.686] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:51.686] $ ...future.elements_ii :List of 1 [15:31:51.686] ..$ b: chr "numeric" [15:31:51.686] $ ...future.seeds_ii : NULL [15:31:51.686] $ ...future.globals.maxSize: NULL [15:31:51.686] - attr(*, "where")=List of 5 [15:31:51.686] ..$ ...future.FUN : [15:31:51.686] ..$ future.call.arguments : [15:31:51.686] ..$ ...future.elements_ii : [15:31:51.686] ..$ ...future.seeds_ii : [15:31:51.686] ..$ ...future.globals.maxSize: [15:31:51.686] - attr(*, "resolved")= logi FALSE [15:31:51.686] - attr(*, "total_size")= num 2240 [15:31:51.686] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:51.686] - attr(*, "already-done")= logi TRUE [15:31:51.697] - copied '...future.FUN' to environment [15:31:51.698] - copied 'future.call.arguments' to environment [15:31:51.698] - copied '...future.elements_ii' to environment [15:31:51.699] - copied '...future.seeds_ii' to environment [15:31:51.699] - copied '...future.globals.maxSize' to environment [15:31:51.700] assign_globals() ... done [15:31:51.701] plan(): Setting new future strategy stack: [15:31:51.701] List of future strategies: [15:31:51.701] 1. sequential: [15:31:51.701] - args: function (..., envir = parent.frame(), workers = "") [15:31:51.701] - tweaked: FALSE [15:31:51.701] - call: NULL [15:31:51.702] plan(): nbrOfWorkers() = 1 [15:31:51.705] plan(): Setting new future strategy stack: [15:31:51.705] List of future strategies: [15:31:51.705] 1. sequential: [15:31:51.705] - args: function (..., envir = parent.frame(), workers = "") [15:31:51.705] - tweaked: FALSE [15:31:51.705] - call: plan(strategy) [15:31:51.706] plan(): nbrOfWorkers() = 1 [15:31:51.707] SequentialFuture started (and completed) [15:31:51.707] - Launch lazy future ... done [15:31:51.708] run() for 'SequentialFuture' ... done [15:31:51.708] Created future: [15:31:51.708] SequentialFuture: [15:31:51.708] Label: 'future_lapply-2' [15:31:51.708] Expression: [15:31:51.708] { [15:31:51.708] do.call(function(...) { [15:31:51.708] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.708] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:51.708] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.708] on.exit(options(oopts), add = TRUE) [15:31:51.708] } [15:31:51.708] { [15:31:51.708] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:51.708] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.708] ...future.FUN(...future.X_jj, ...) [15:31:51.708] }) [15:31:51.708] } [15:31:51.708] }, args = future.call.arguments) [15:31:51.708] } [15:31:51.708] Lazy evaluation: FALSE [15:31:51.708] Asynchronous evaluation: FALSE [15:31:51.708] Local evaluation: TRUE [15:31:51.708] Environment: R_GlobalEnv [15:31:51.708] Capture standard output: TRUE [15:31:51.708] Capture condition classes: 'condition' (excluding 'nothing') [15:31:51.708] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:51.708] Packages: [15:31:51.708] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:51.708] Resolved: TRUE [15:31:51.708] Value: 64 bytes of class 'list' [15:31:51.708] Early signaling: FALSE [15:31:51.708] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:51.708] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:51.711] Chunk #2 of 4 ... DONE [15:31:51.711] Chunk #3 of 4 ... [15:31:51.711] - Finding globals in 'X' for chunk #3 ... [15:31:51.712] getGlobalsAndPackages() ... [15:31:51.712] Searching for globals... [15:31:51.712] [15:31:51.713] Searching for globals ... DONE [15:31:51.713] - globals: [0] [15:31:51.713] getGlobalsAndPackages() ... DONE [15:31:51.714] + additional globals found: [n=0] [15:31:51.714] + additional namespaces needed: [n=0] [15:31:51.714] - Finding globals in 'X' for chunk #3 ... DONE [15:31:51.714] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:51.715] - seeds: [15:31:51.715] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.715] getGlobalsAndPackages() ... [15:31:51.716] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.716] Resolving globals: FALSE [15:31:51.716] Tweak future expression to call with '...' arguments ... [15:31:51.717] { [15:31:51.717] do.call(function(...) { [15:31:51.717] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.717] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:51.717] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.717] on.exit(options(oopts), add = TRUE) [15:31:51.717] } [15:31:51.717] { [15:31:51.717] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:51.717] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.717] ...future.FUN(...future.X_jj, ...) [15:31:51.717] }) [15:31:51.717] } [15:31:51.717] }, args = future.call.arguments) [15:31:51.717] } [15:31:51.717] Tweak future expression to call with '...' arguments ... DONE [15:31:51.718] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.718] [15:31:51.719] getGlobalsAndPackages() ... DONE [15:31:51.719] run() for 'Future' ... [15:31:51.720] - state: 'created' [15:31:51.720] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:51.721] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:51.721] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:51.721] - Field: 'label' [15:31:51.722] - Field: 'local' [15:31:51.722] - Field: 'owner' [15:31:51.722] - Field: 'envir' [15:31:51.723] - Field: 'packages' [15:31:51.723] - Field: 'gc' [15:31:51.723] - Field: 'conditions' [15:31:51.724] - Field: 'expr' [15:31:51.724] - Field: 'uuid' [15:31:51.724] - Field: 'seed' [15:31:51.724] - Field: 'version' [15:31:51.725] - Field: 'result' [15:31:51.725] - Field: 'asynchronous' [15:31:51.725] - Field: 'calls' [15:31:51.726] - Field: 'globals' [15:31:51.726] - Field: 'stdout' [15:31:51.726] - Field: 'earlySignal' [15:31:51.727] - Field: 'lazy' [15:31:51.727] - Field: 'state' [15:31:51.727] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:51.727] - Launch lazy future ... [15:31:51.728] Packages needed by the future expression (n = 0): [15:31:51.728] Packages needed by future strategies (n = 0): [15:31:51.730] { [15:31:51.730] { [15:31:51.730] { [15:31:51.730] ...future.startTime <- base::Sys.time() [15:31:51.730] { [15:31:51.730] { [15:31:51.730] { [15:31:51.730] base::local({ [15:31:51.730] has_future <- base::requireNamespace("future", [15:31:51.730] quietly = TRUE) [15:31:51.730] if (has_future) { [15:31:51.730] ns <- base::getNamespace("future") [15:31:51.730] version <- ns[[".package"]][["version"]] [15:31:51.730] if (is.null(version)) [15:31:51.730] version <- utils::packageVersion("future") [15:31:51.730] } [15:31:51.730] else { [15:31:51.730] version <- NULL [15:31:51.730] } [15:31:51.730] if (!has_future || version < "1.8.0") { [15:31:51.730] info <- base::c(r_version = base::gsub("R version ", [15:31:51.730] "", base::R.version$version.string), [15:31:51.730] platform = base::sprintf("%s (%s-bit)", [15:31:51.730] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:51.730] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:51.730] "release", "version")], collapse = " "), [15:31:51.730] hostname = base::Sys.info()[["nodename"]]) [15:31:51.730] info <- base::sprintf("%s: %s", base::names(info), [15:31:51.730] info) [15:31:51.730] info <- base::paste(info, collapse = "; ") [15:31:51.730] if (!has_future) { [15:31:51.730] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:51.730] info) [15:31:51.730] } [15:31:51.730] else { [15:31:51.730] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:51.730] info, version) [15:31:51.730] } [15:31:51.730] base::stop(msg) [15:31:51.730] } [15:31:51.730] }) [15:31:51.730] } [15:31:51.730] ...future.strategy.old <- future::plan("list") [15:31:51.730] options(future.plan = NULL) [15:31:51.730] Sys.unsetenv("R_FUTURE_PLAN") [15:31:51.730] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:51.730] } [15:31:51.730] ...future.workdir <- getwd() [15:31:51.730] } [15:31:51.730] ...future.oldOptions <- base::as.list(base::.Options) [15:31:51.730] ...future.oldEnvVars <- base::Sys.getenv() [15:31:51.730] } [15:31:51.730] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:51.730] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:51.730] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:51.730] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:51.730] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:51.730] future.stdout.windows.reencode = NULL, width = 80L) [15:31:51.730] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:51.730] base::names(...future.oldOptions)) [15:31:51.730] } [15:31:51.730] if (FALSE) { [15:31:51.730] } [15:31:51.730] else { [15:31:51.730] if (TRUE) { [15:31:51.730] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:51.730] open = "w") [15:31:51.730] } [15:31:51.730] else { [15:31:51.730] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:51.730] windows = "NUL", "/dev/null"), open = "w") [15:31:51.730] } [15:31:51.730] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:51.730] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:51.730] base::sink(type = "output", split = FALSE) [15:31:51.730] base::close(...future.stdout) [15:31:51.730] }, add = TRUE) [15:31:51.730] } [15:31:51.730] ...future.frame <- base::sys.nframe() [15:31:51.730] ...future.conditions <- base::list() [15:31:51.730] ...future.rng <- base::globalenv()$.Random.seed [15:31:51.730] if (FALSE) { [15:31:51.730] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:51.730] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:51.730] } [15:31:51.730] ...future.result <- base::tryCatch({ [15:31:51.730] base::withCallingHandlers({ [15:31:51.730] ...future.value <- base::withVisible(base::local({ [15:31:51.730] do.call(function(...) { [15:31:51.730] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.730] if (!identical(...future.globals.maxSize.org, [15:31:51.730] ...future.globals.maxSize)) { [15:31:51.730] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.730] on.exit(options(oopts), add = TRUE) [15:31:51.730] } [15:31:51.730] { [15:31:51.730] lapply(seq_along(...future.elements_ii), [15:31:51.730] FUN = function(jj) { [15:31:51.730] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.730] ...future.FUN(...future.X_jj, ...) [15:31:51.730] }) [15:31:51.730] } [15:31:51.730] }, args = future.call.arguments) [15:31:51.730] })) [15:31:51.730] future::FutureResult(value = ...future.value$value, [15:31:51.730] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:51.730] ...future.rng), globalenv = if (FALSE) [15:31:51.730] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:51.730] ...future.globalenv.names)) [15:31:51.730] else NULL, started = ...future.startTime, version = "1.8") [15:31:51.730] }, condition = base::local({ [15:31:51.730] c <- base::c [15:31:51.730] inherits <- base::inherits [15:31:51.730] invokeRestart <- base::invokeRestart [15:31:51.730] length <- base::length [15:31:51.730] list <- base::list [15:31:51.730] seq.int <- base::seq.int [15:31:51.730] signalCondition <- base::signalCondition [15:31:51.730] sys.calls <- base::sys.calls [15:31:51.730] `[[` <- base::`[[` [15:31:51.730] `+` <- base::`+` [15:31:51.730] `<<-` <- base::`<<-` [15:31:51.730] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:51.730] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:51.730] 3L)] [15:31:51.730] } [15:31:51.730] function(cond) { [15:31:51.730] is_error <- inherits(cond, "error") [15:31:51.730] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:51.730] NULL) [15:31:51.730] if (is_error) { [15:31:51.730] sessionInformation <- function() { [15:31:51.730] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:51.730] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:51.730] search = base::search(), system = base::Sys.info()) [15:31:51.730] } [15:31:51.730] ...future.conditions[[length(...future.conditions) + [15:31:51.730] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:51.730] cond$call), session = sessionInformation(), [15:31:51.730] timestamp = base::Sys.time(), signaled = 0L) [15:31:51.730] signalCondition(cond) [15:31:51.730] } [15:31:51.730] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:51.730] "immediateCondition"))) { [15:31:51.730] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:51.730] ...future.conditions[[length(...future.conditions) + [15:31:51.730] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:51.730] if (TRUE && !signal) { [15:31:51.730] muffleCondition <- function (cond, pattern = "^muffle") [15:31:51.730] { [15:31:51.730] inherits <- base::inherits [15:31:51.730] invokeRestart <- base::invokeRestart [15:31:51.730] is.null <- base::is.null [15:31:51.730] muffled <- FALSE [15:31:51.730] if (inherits(cond, "message")) { [15:31:51.730] muffled <- grepl(pattern, "muffleMessage") [15:31:51.730] if (muffled) [15:31:51.730] invokeRestart("muffleMessage") [15:31:51.730] } [15:31:51.730] else if (inherits(cond, "warning")) { [15:31:51.730] muffled <- grepl(pattern, "muffleWarning") [15:31:51.730] if (muffled) [15:31:51.730] invokeRestart("muffleWarning") [15:31:51.730] } [15:31:51.730] else if (inherits(cond, "condition")) { [15:31:51.730] if (!is.null(pattern)) { [15:31:51.730] computeRestarts <- base::computeRestarts [15:31:51.730] grepl <- base::grepl [15:31:51.730] restarts <- computeRestarts(cond) [15:31:51.730] for (restart in restarts) { [15:31:51.730] name <- restart$name [15:31:51.730] if (is.null(name)) [15:31:51.730] next [15:31:51.730] if (!grepl(pattern, name)) [15:31:51.730] next [15:31:51.730] invokeRestart(restart) [15:31:51.730] muffled <- TRUE [15:31:51.730] break [15:31:51.730] } [15:31:51.730] } [15:31:51.730] } [15:31:51.730] invisible(muffled) [15:31:51.730] } [15:31:51.730] muffleCondition(cond, pattern = "^muffle") [15:31:51.730] } [15:31:51.730] } [15:31:51.730] else { [15:31:51.730] if (TRUE) { [15:31:51.730] muffleCondition <- function (cond, pattern = "^muffle") [15:31:51.730] { [15:31:51.730] inherits <- base::inherits [15:31:51.730] invokeRestart <- base::invokeRestart [15:31:51.730] is.null <- base::is.null [15:31:51.730] muffled <- FALSE [15:31:51.730] if (inherits(cond, "message")) { [15:31:51.730] muffled <- grepl(pattern, "muffleMessage") [15:31:51.730] if (muffled) [15:31:51.730] invokeRestart("muffleMessage") [15:31:51.730] } [15:31:51.730] else if (inherits(cond, "warning")) { [15:31:51.730] muffled <- grepl(pattern, "muffleWarning") [15:31:51.730] if (muffled) [15:31:51.730] invokeRestart("muffleWarning") [15:31:51.730] } [15:31:51.730] else if (inherits(cond, "condition")) { [15:31:51.730] if (!is.null(pattern)) { [15:31:51.730] computeRestarts <- base::computeRestarts [15:31:51.730] grepl <- base::grepl [15:31:51.730] restarts <- computeRestarts(cond) [15:31:51.730] for (restart in restarts) { [15:31:51.730] name <- restart$name [15:31:51.730] if (is.null(name)) [15:31:51.730] next [15:31:51.730] if (!grepl(pattern, name)) [15:31:51.730] next [15:31:51.730] invokeRestart(restart) [15:31:51.730] muffled <- TRUE [15:31:51.730] break [15:31:51.730] } [15:31:51.730] } [15:31:51.730] } [15:31:51.730] invisible(muffled) [15:31:51.730] } [15:31:51.730] muffleCondition(cond, pattern = "^muffle") [15:31:51.730] } [15:31:51.730] } [15:31:51.730] } [15:31:51.730] })) [15:31:51.730] }, error = function(ex) { [15:31:51.730] base::structure(base::list(value = NULL, visible = NULL, [15:31:51.730] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:51.730] ...future.rng), started = ...future.startTime, [15:31:51.730] finished = Sys.time(), session_uuid = NA_character_, [15:31:51.730] version = "1.8"), class = "FutureResult") [15:31:51.730] }, finally = { [15:31:51.730] if (!identical(...future.workdir, getwd())) [15:31:51.730] setwd(...future.workdir) [15:31:51.730] { [15:31:51.730] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:51.730] ...future.oldOptions$nwarnings <- NULL [15:31:51.730] } [15:31:51.730] base::options(...future.oldOptions) [15:31:51.730] if (.Platform$OS.type == "windows") { [15:31:51.730] old_names <- names(...future.oldEnvVars) [15:31:51.730] envs <- base::Sys.getenv() [15:31:51.730] names <- names(envs) [15:31:51.730] common <- intersect(names, old_names) [15:31:51.730] added <- setdiff(names, old_names) [15:31:51.730] removed <- setdiff(old_names, names) [15:31:51.730] changed <- common[...future.oldEnvVars[common] != [15:31:51.730] envs[common]] [15:31:51.730] NAMES <- toupper(changed) [15:31:51.730] args <- list() [15:31:51.730] for (kk in seq_along(NAMES)) { [15:31:51.730] name <- changed[[kk]] [15:31:51.730] NAME <- NAMES[[kk]] [15:31:51.730] if (name != NAME && is.element(NAME, old_names)) [15:31:51.730] next [15:31:51.730] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:51.730] } [15:31:51.730] NAMES <- toupper(added) [15:31:51.730] for (kk in seq_along(NAMES)) { [15:31:51.730] name <- added[[kk]] [15:31:51.730] NAME <- NAMES[[kk]] [15:31:51.730] if (name != NAME && is.element(NAME, old_names)) [15:31:51.730] next [15:31:51.730] args[[name]] <- "" [15:31:51.730] } [15:31:51.730] NAMES <- toupper(removed) [15:31:51.730] for (kk in seq_along(NAMES)) { [15:31:51.730] name <- removed[[kk]] [15:31:51.730] NAME <- NAMES[[kk]] [15:31:51.730] if (name != NAME && is.element(NAME, old_names)) [15:31:51.730] next [15:31:51.730] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:51.730] } [15:31:51.730] if (length(args) > 0) [15:31:51.730] base::do.call(base::Sys.setenv, args = args) [15:31:51.730] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:51.730] } [15:31:51.730] else { [15:31:51.730] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:51.730] } [15:31:51.730] { [15:31:51.730] if (base::length(...future.futureOptionsAdded) > [15:31:51.730] 0L) { [15:31:51.730] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:51.730] base::names(opts) <- ...future.futureOptionsAdded [15:31:51.730] base::options(opts) [15:31:51.730] } [15:31:51.730] { [15:31:51.730] { [15:31:51.730] NULL [15:31:51.730] RNGkind("Mersenne-Twister") [15:31:51.730] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:51.730] inherits = FALSE) [15:31:51.730] } [15:31:51.730] options(future.plan = NULL) [15:31:51.730] if (is.na(NA_character_)) [15:31:51.730] Sys.unsetenv("R_FUTURE_PLAN") [15:31:51.730] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:51.730] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:51.730] .init = FALSE) [15:31:51.730] } [15:31:51.730] } [15:31:51.730] } [15:31:51.730] }) [15:31:51.730] if (TRUE) { [15:31:51.730] base::sink(type = "output", split = FALSE) [15:31:51.730] if (TRUE) { [15:31:51.730] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:51.730] } [15:31:51.730] else { [15:31:51.730] ...future.result["stdout"] <- base::list(NULL) [15:31:51.730] } [15:31:51.730] base::close(...future.stdout) [15:31:51.730] ...future.stdout <- NULL [15:31:51.730] } [15:31:51.730] ...future.result$conditions <- ...future.conditions [15:31:51.730] ...future.result$finished <- base::Sys.time() [15:31:51.730] ...future.result [15:31:51.730] } [15:31:51.736] assign_globals() ... [15:31:51.736] List of 5 [15:31:51.736] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:51.736] $ future.call.arguments :List of 1 [15:31:51.736] ..$ length: int 2 [15:31:51.736] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:51.736] $ ...future.elements_ii :List of 1 [15:31:51.736] ..$ c: chr "character" [15:31:51.736] $ ...future.seeds_ii : NULL [15:31:51.736] $ ...future.globals.maxSize: NULL [15:31:51.736] - attr(*, "where")=List of 5 [15:31:51.736] ..$ ...future.FUN : [15:31:51.736] ..$ future.call.arguments : [15:31:51.736] ..$ ...future.elements_ii : [15:31:51.736] ..$ ...future.seeds_ii : [15:31:51.736] ..$ ...future.globals.maxSize: [15:31:51.736] - attr(*, "resolved")= logi FALSE [15:31:51.736] - attr(*, "total_size")= num 2240 [15:31:51.736] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:51.736] - attr(*, "already-done")= logi TRUE [15:31:51.748] - copied '...future.FUN' to environment [15:31:51.748] - copied 'future.call.arguments' to environment [15:31:51.748] - copied '...future.elements_ii' to environment [15:31:51.749] - copied '...future.seeds_ii' to environment [15:31:51.749] - copied '...future.globals.maxSize' to environment [15:31:51.749] assign_globals() ... done [15:31:51.750] plan(): Setting new future strategy stack: [15:31:51.750] List of future strategies: [15:31:51.750] 1. sequential: [15:31:51.750] - args: function (..., envir = parent.frame(), workers = "") [15:31:51.750] - tweaked: FALSE [15:31:51.750] - call: NULL [15:31:51.751] plan(): nbrOfWorkers() = 1 [15:31:51.754] plan(): Setting new future strategy stack: [15:31:51.754] List of future strategies: [15:31:51.754] 1. sequential: [15:31:51.754] - args: function (..., envir = parent.frame(), workers = "") [15:31:51.754] - tweaked: FALSE [15:31:51.754] - call: plan(strategy) [15:31:51.755] plan(): nbrOfWorkers() = 1 [15:31:51.756] SequentialFuture started (and completed) [15:31:51.756] - Launch lazy future ... done [15:31:51.756] run() for 'SequentialFuture' ... done [15:31:51.757] Created future: [15:31:51.757] SequentialFuture: [15:31:51.757] Label: 'future_lapply-3' [15:31:51.757] Expression: [15:31:51.757] { [15:31:51.757] do.call(function(...) { [15:31:51.757] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.757] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:51.757] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.757] on.exit(options(oopts), add = TRUE) [15:31:51.757] } [15:31:51.757] { [15:31:51.757] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:51.757] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.757] ...future.FUN(...future.X_jj, ...) [15:31:51.757] }) [15:31:51.757] } [15:31:51.757] }, args = future.call.arguments) [15:31:51.757] } [15:31:51.757] Lazy evaluation: FALSE [15:31:51.757] Asynchronous evaluation: FALSE [15:31:51.757] Local evaluation: TRUE [15:31:51.757] Environment: R_GlobalEnv [15:31:51.757] Capture standard output: TRUE [15:31:51.757] Capture condition classes: 'condition' (excluding 'nothing') [15:31:51.757] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 120 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:51.757] Packages: [15:31:51.757] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:51.757] Resolved: TRUE [15:31:51.757] Value: 120 bytes of class 'list' [15:31:51.757] Early signaling: FALSE [15:31:51.757] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:51.757] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:51.760] Chunk #3 of 4 ... DONE [15:31:51.760] Chunk #4 of 4 ... [15:31:51.760] - Finding globals in 'X' for chunk #4 ... [15:31:51.761] getGlobalsAndPackages() ... [15:31:51.761] Searching for globals... [15:31:51.762] [15:31:51.762] Searching for globals ... DONE [15:31:51.762] - globals: [0] [15:31:51.762] getGlobalsAndPackages() ... DONE [15:31:51.763] + additional globals found: [n=0] [15:31:51.763] + additional namespaces needed: [n=0] [15:31:51.763] - Finding globals in 'X' for chunk #4 ... DONE [15:31:51.763] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:51.764] - seeds: [15:31:51.764] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.764] getGlobalsAndPackages() ... [15:31:51.764] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.765] Resolving globals: FALSE [15:31:51.765] Tweak future expression to call with '...' arguments ... [15:31:51.765] { [15:31:51.765] do.call(function(...) { [15:31:51.765] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.765] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:51.765] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.765] on.exit(options(oopts), add = TRUE) [15:31:51.765] } [15:31:51.765] { [15:31:51.765] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:51.765] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.765] ...future.FUN(...future.X_jj, ...) [15:31:51.765] }) [15:31:51.765] } [15:31:51.765] }, args = future.call.arguments) [15:31:51.765] } [15:31:51.766] Tweak future expression to call with '...' arguments ... DONE [15:31:51.767] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.767] [15:31:51.767] getGlobalsAndPackages() ... DONE [15:31:51.768] run() for 'Future' ... [15:31:51.768] - state: 'created' [15:31:51.769] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:51.769] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:51.769] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:51.770] - Field: 'label' [15:31:51.770] - Field: 'local' [15:31:51.770] - Field: 'owner' [15:31:51.770] - Field: 'envir' [15:31:51.771] - Field: 'packages' [15:31:51.771] - Field: 'gc' [15:31:51.771] - Field: 'conditions' [15:31:51.771] - Field: 'expr' [15:31:51.771] - Field: 'uuid' [15:31:51.772] - Field: 'seed' [15:31:51.772] - Field: 'version' [15:31:51.772] - Field: 'result' [15:31:51.772] - Field: 'asynchronous' [15:31:51.773] - Field: 'calls' [15:31:51.773] - Field: 'globals' [15:31:51.773] - Field: 'stdout' [15:31:51.774] - Field: 'earlySignal' [15:31:51.774] - Field: 'lazy' [15:31:51.774] - Field: 'state' [15:31:51.775] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:51.775] - Launch lazy future ... [15:31:51.775] Packages needed by the future expression (n = 0): [15:31:51.775] Packages needed by future strategies (n = 0): [15:31:51.776] { [15:31:51.776] { [15:31:51.776] { [15:31:51.776] ...future.startTime <- base::Sys.time() [15:31:51.776] { [15:31:51.776] { [15:31:51.776] { [15:31:51.776] base::local({ [15:31:51.776] has_future <- base::requireNamespace("future", [15:31:51.776] quietly = TRUE) [15:31:51.776] if (has_future) { [15:31:51.776] ns <- base::getNamespace("future") [15:31:51.776] version <- ns[[".package"]][["version"]] [15:31:51.776] if (is.null(version)) [15:31:51.776] version <- utils::packageVersion("future") [15:31:51.776] } [15:31:51.776] else { [15:31:51.776] version <- NULL [15:31:51.776] } [15:31:51.776] if (!has_future || version < "1.8.0") { [15:31:51.776] info <- base::c(r_version = base::gsub("R version ", [15:31:51.776] "", base::R.version$version.string), [15:31:51.776] platform = base::sprintf("%s (%s-bit)", [15:31:51.776] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:51.776] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:51.776] "release", "version")], collapse = " "), [15:31:51.776] hostname = base::Sys.info()[["nodename"]]) [15:31:51.776] info <- base::sprintf("%s: %s", base::names(info), [15:31:51.776] info) [15:31:51.776] info <- base::paste(info, collapse = "; ") [15:31:51.776] if (!has_future) { [15:31:51.776] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:51.776] info) [15:31:51.776] } [15:31:51.776] else { [15:31:51.776] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:51.776] info, version) [15:31:51.776] } [15:31:51.776] base::stop(msg) [15:31:51.776] } [15:31:51.776] }) [15:31:51.776] } [15:31:51.776] ...future.strategy.old <- future::plan("list") [15:31:51.776] options(future.plan = NULL) [15:31:51.776] Sys.unsetenv("R_FUTURE_PLAN") [15:31:51.776] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:51.776] } [15:31:51.776] ...future.workdir <- getwd() [15:31:51.776] } [15:31:51.776] ...future.oldOptions <- base::as.list(base::.Options) [15:31:51.776] ...future.oldEnvVars <- base::Sys.getenv() [15:31:51.776] } [15:31:51.776] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:51.776] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:51.776] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:51.776] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:51.776] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:51.776] future.stdout.windows.reencode = NULL, width = 80L) [15:31:51.776] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:51.776] base::names(...future.oldOptions)) [15:31:51.776] } [15:31:51.776] if (FALSE) { [15:31:51.776] } [15:31:51.776] else { [15:31:51.776] if (TRUE) { [15:31:51.776] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:51.776] open = "w") [15:31:51.776] } [15:31:51.776] else { [15:31:51.776] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:51.776] windows = "NUL", "/dev/null"), open = "w") [15:31:51.776] } [15:31:51.776] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:51.776] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:51.776] base::sink(type = "output", split = FALSE) [15:31:51.776] base::close(...future.stdout) [15:31:51.776] }, add = TRUE) [15:31:51.776] } [15:31:51.776] ...future.frame <- base::sys.nframe() [15:31:51.776] ...future.conditions <- base::list() [15:31:51.776] ...future.rng <- base::globalenv()$.Random.seed [15:31:51.776] if (FALSE) { [15:31:51.776] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:51.776] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:51.776] } [15:31:51.776] ...future.result <- base::tryCatch({ [15:31:51.776] base::withCallingHandlers({ [15:31:51.776] ...future.value <- base::withVisible(base::local({ [15:31:51.776] do.call(function(...) { [15:31:51.776] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.776] if (!identical(...future.globals.maxSize.org, [15:31:51.776] ...future.globals.maxSize)) { [15:31:51.776] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.776] on.exit(options(oopts), add = TRUE) [15:31:51.776] } [15:31:51.776] { [15:31:51.776] lapply(seq_along(...future.elements_ii), [15:31:51.776] FUN = function(jj) { [15:31:51.776] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.776] ...future.FUN(...future.X_jj, ...) [15:31:51.776] }) [15:31:51.776] } [15:31:51.776] }, args = future.call.arguments) [15:31:51.776] })) [15:31:51.776] future::FutureResult(value = ...future.value$value, [15:31:51.776] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:51.776] ...future.rng), globalenv = if (FALSE) [15:31:51.776] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:51.776] ...future.globalenv.names)) [15:31:51.776] else NULL, started = ...future.startTime, version = "1.8") [15:31:51.776] }, condition = base::local({ [15:31:51.776] c <- base::c [15:31:51.776] inherits <- base::inherits [15:31:51.776] invokeRestart <- base::invokeRestart [15:31:51.776] length <- base::length [15:31:51.776] list <- base::list [15:31:51.776] seq.int <- base::seq.int [15:31:51.776] signalCondition <- base::signalCondition [15:31:51.776] sys.calls <- base::sys.calls [15:31:51.776] `[[` <- base::`[[` [15:31:51.776] `+` <- base::`+` [15:31:51.776] `<<-` <- base::`<<-` [15:31:51.776] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:51.776] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:51.776] 3L)] [15:31:51.776] } [15:31:51.776] function(cond) { [15:31:51.776] is_error <- inherits(cond, "error") [15:31:51.776] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:51.776] NULL) [15:31:51.776] if (is_error) { [15:31:51.776] sessionInformation <- function() { [15:31:51.776] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:51.776] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:51.776] search = base::search(), system = base::Sys.info()) [15:31:51.776] } [15:31:51.776] ...future.conditions[[length(...future.conditions) + [15:31:51.776] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:51.776] cond$call), session = sessionInformation(), [15:31:51.776] timestamp = base::Sys.time(), signaled = 0L) [15:31:51.776] signalCondition(cond) [15:31:51.776] } [15:31:51.776] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:51.776] "immediateCondition"))) { [15:31:51.776] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:51.776] ...future.conditions[[length(...future.conditions) + [15:31:51.776] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:51.776] if (TRUE && !signal) { [15:31:51.776] muffleCondition <- function (cond, pattern = "^muffle") [15:31:51.776] { [15:31:51.776] inherits <- base::inherits [15:31:51.776] invokeRestart <- base::invokeRestart [15:31:51.776] is.null <- base::is.null [15:31:51.776] muffled <- FALSE [15:31:51.776] if (inherits(cond, "message")) { [15:31:51.776] muffled <- grepl(pattern, "muffleMessage") [15:31:51.776] if (muffled) [15:31:51.776] invokeRestart("muffleMessage") [15:31:51.776] } [15:31:51.776] else if (inherits(cond, "warning")) { [15:31:51.776] muffled <- grepl(pattern, "muffleWarning") [15:31:51.776] if (muffled) [15:31:51.776] invokeRestart("muffleWarning") [15:31:51.776] } [15:31:51.776] else if (inherits(cond, "condition")) { [15:31:51.776] if (!is.null(pattern)) { [15:31:51.776] computeRestarts <- base::computeRestarts [15:31:51.776] grepl <- base::grepl [15:31:51.776] restarts <- computeRestarts(cond) [15:31:51.776] for (restart in restarts) { [15:31:51.776] name <- restart$name [15:31:51.776] if (is.null(name)) [15:31:51.776] next [15:31:51.776] if (!grepl(pattern, name)) [15:31:51.776] next [15:31:51.776] invokeRestart(restart) [15:31:51.776] muffled <- TRUE [15:31:51.776] break [15:31:51.776] } [15:31:51.776] } [15:31:51.776] } [15:31:51.776] invisible(muffled) [15:31:51.776] } [15:31:51.776] muffleCondition(cond, pattern = "^muffle") [15:31:51.776] } [15:31:51.776] } [15:31:51.776] else { [15:31:51.776] if (TRUE) { [15:31:51.776] muffleCondition <- function (cond, pattern = "^muffle") [15:31:51.776] { [15:31:51.776] inherits <- base::inherits [15:31:51.776] invokeRestart <- base::invokeRestart [15:31:51.776] is.null <- base::is.null [15:31:51.776] muffled <- FALSE [15:31:51.776] if (inherits(cond, "message")) { [15:31:51.776] muffled <- grepl(pattern, "muffleMessage") [15:31:51.776] if (muffled) [15:31:51.776] invokeRestart("muffleMessage") [15:31:51.776] } [15:31:51.776] else if (inherits(cond, "warning")) { [15:31:51.776] muffled <- grepl(pattern, "muffleWarning") [15:31:51.776] if (muffled) [15:31:51.776] invokeRestart("muffleWarning") [15:31:51.776] } [15:31:51.776] else if (inherits(cond, "condition")) { [15:31:51.776] if (!is.null(pattern)) { [15:31:51.776] computeRestarts <- base::computeRestarts [15:31:51.776] grepl <- base::grepl [15:31:51.776] restarts <- computeRestarts(cond) [15:31:51.776] for (restart in restarts) { [15:31:51.776] name <- restart$name [15:31:51.776] if (is.null(name)) [15:31:51.776] next [15:31:51.776] if (!grepl(pattern, name)) [15:31:51.776] next [15:31:51.776] invokeRestart(restart) [15:31:51.776] muffled <- TRUE [15:31:51.776] break [15:31:51.776] } [15:31:51.776] } [15:31:51.776] } [15:31:51.776] invisible(muffled) [15:31:51.776] } [15:31:51.776] muffleCondition(cond, pattern = "^muffle") [15:31:51.776] } [15:31:51.776] } [15:31:51.776] } [15:31:51.776] })) [15:31:51.776] }, error = function(ex) { [15:31:51.776] base::structure(base::list(value = NULL, visible = NULL, [15:31:51.776] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:51.776] ...future.rng), started = ...future.startTime, [15:31:51.776] finished = Sys.time(), session_uuid = NA_character_, [15:31:51.776] version = "1.8"), class = "FutureResult") [15:31:51.776] }, finally = { [15:31:51.776] if (!identical(...future.workdir, getwd())) [15:31:51.776] setwd(...future.workdir) [15:31:51.776] { [15:31:51.776] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:51.776] ...future.oldOptions$nwarnings <- NULL [15:31:51.776] } [15:31:51.776] base::options(...future.oldOptions) [15:31:51.776] if (.Platform$OS.type == "windows") { [15:31:51.776] old_names <- names(...future.oldEnvVars) [15:31:51.776] envs <- base::Sys.getenv() [15:31:51.776] names <- names(envs) [15:31:51.776] common <- intersect(names, old_names) [15:31:51.776] added <- setdiff(names, old_names) [15:31:51.776] removed <- setdiff(old_names, names) [15:31:51.776] changed <- common[...future.oldEnvVars[common] != [15:31:51.776] envs[common]] [15:31:51.776] NAMES <- toupper(changed) [15:31:51.776] args <- list() [15:31:51.776] for (kk in seq_along(NAMES)) { [15:31:51.776] name <- changed[[kk]] [15:31:51.776] NAME <- NAMES[[kk]] [15:31:51.776] if (name != NAME && is.element(NAME, old_names)) [15:31:51.776] next [15:31:51.776] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:51.776] } [15:31:51.776] NAMES <- toupper(added) [15:31:51.776] for (kk in seq_along(NAMES)) { [15:31:51.776] name <- added[[kk]] [15:31:51.776] NAME <- NAMES[[kk]] [15:31:51.776] if (name != NAME && is.element(NAME, old_names)) [15:31:51.776] next [15:31:51.776] args[[name]] <- "" [15:31:51.776] } [15:31:51.776] NAMES <- toupper(removed) [15:31:51.776] for (kk in seq_along(NAMES)) { [15:31:51.776] name <- removed[[kk]] [15:31:51.776] NAME <- NAMES[[kk]] [15:31:51.776] if (name != NAME && is.element(NAME, old_names)) [15:31:51.776] next [15:31:51.776] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:51.776] } [15:31:51.776] if (length(args) > 0) [15:31:51.776] base::do.call(base::Sys.setenv, args = args) [15:31:51.776] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:51.776] } [15:31:51.776] else { [15:31:51.776] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:51.776] } [15:31:51.776] { [15:31:51.776] if (base::length(...future.futureOptionsAdded) > [15:31:51.776] 0L) { [15:31:51.776] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:51.776] base::names(opts) <- ...future.futureOptionsAdded [15:31:51.776] base::options(opts) [15:31:51.776] } [15:31:51.776] { [15:31:51.776] { [15:31:51.776] NULL [15:31:51.776] RNGkind("Mersenne-Twister") [15:31:51.776] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:51.776] inherits = FALSE) [15:31:51.776] } [15:31:51.776] options(future.plan = NULL) [15:31:51.776] if (is.na(NA_character_)) [15:31:51.776] Sys.unsetenv("R_FUTURE_PLAN") [15:31:51.776] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:51.776] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:51.776] .init = FALSE) [15:31:51.776] } [15:31:51.776] } [15:31:51.776] } [15:31:51.776] }) [15:31:51.776] if (TRUE) { [15:31:51.776] base::sink(type = "output", split = FALSE) [15:31:51.776] if (TRUE) { [15:31:51.776] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:51.776] } [15:31:51.776] else { [15:31:51.776] ...future.result["stdout"] <- base::list(NULL) [15:31:51.776] } [15:31:51.776] base::close(...future.stdout) [15:31:51.776] ...future.stdout <- NULL [15:31:51.776] } [15:31:51.776] ...future.result$conditions <- ...future.conditions [15:31:51.776] ...future.result$finished <- base::Sys.time() [15:31:51.776] ...future.result [15:31:51.776] } [15:31:51.781] assign_globals() ... [15:31:51.781] List of 5 [15:31:51.781] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:51.781] $ future.call.arguments :List of 1 [15:31:51.781] ..$ length: int 2 [15:31:51.781] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:51.781] $ ...future.elements_ii :List of 1 [15:31:51.781] ..$ c: chr "list" [15:31:51.781] $ ...future.seeds_ii : NULL [15:31:51.781] $ ...future.globals.maxSize: NULL [15:31:51.781] - attr(*, "where")=List of 5 [15:31:51.781] ..$ ...future.FUN : [15:31:51.781] ..$ future.call.arguments : [15:31:51.781] ..$ ...future.elements_ii : [15:31:51.781] ..$ ...future.seeds_ii : [15:31:51.781] ..$ ...future.globals.maxSize: [15:31:51.781] - attr(*, "resolved")= logi FALSE [15:31:51.781] - attr(*, "total_size")= num 2240 [15:31:51.781] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:51.781] - attr(*, "already-done")= logi TRUE [15:31:51.789] - copied '...future.FUN' to environment [15:31:51.789] - copied 'future.call.arguments' to environment [15:31:51.789] - copied '...future.elements_ii' to environment [15:31:51.790] - copied '...future.seeds_ii' to environment [15:31:51.790] - copied '...future.globals.maxSize' to environment [15:31:51.790] assign_globals() ... done [15:31:51.790] plan(): Setting new future strategy stack: [15:31:51.791] List of future strategies: [15:31:51.791] 1. sequential: [15:31:51.791] - args: function (..., envir = parent.frame(), workers = "") [15:31:51.791] - tweaked: FALSE [15:31:51.791] - call: NULL [15:31:51.791] plan(): nbrOfWorkers() = 1 [15:31:51.793] plan(): Setting new future strategy stack: [15:31:51.793] List of future strategies: [15:31:51.793] 1. sequential: [15:31:51.793] - args: function (..., envir = parent.frame(), workers = "") [15:31:51.793] - tweaked: FALSE [15:31:51.793] - call: plan(strategy) [15:31:51.794] plan(): nbrOfWorkers() = 1 [15:31:51.794] SequentialFuture started (and completed) [15:31:51.795] - Launch lazy future ... done [15:31:51.795] run() for 'SequentialFuture' ... done [15:31:51.795] Created future: [15:31:51.795] SequentialFuture: [15:31:51.795] Label: 'future_lapply-4' [15:31:51.795] Expression: [15:31:51.795] { [15:31:51.795] do.call(function(...) { [15:31:51.795] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.795] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:51.795] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.795] on.exit(options(oopts), add = TRUE) [15:31:51.795] } [15:31:51.795] { [15:31:51.795] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:51.795] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.795] ...future.FUN(...future.X_jj, ...) [15:31:51.795] }) [15:31:51.795] } [15:31:51.795] }, args = future.call.arguments) [15:31:51.795] } [15:31:51.795] Lazy evaluation: FALSE [15:31:51.795] Asynchronous evaluation: FALSE [15:31:51.795] Local evaluation: TRUE [15:31:51.795] Environment: R_GlobalEnv [15:31:51.795] Capture standard output: TRUE [15:31:51.795] Capture condition classes: 'condition' (excluding 'nothing') [15:31:51.795] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:51.795] Packages: [15:31:51.795] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:51.795] Resolved: TRUE [15:31:51.795] Value: 0 bytes of class 'list' [15:31:51.795] Early signaling: FALSE [15:31:51.795] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:51.795] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:51.801] Chunk #4 of 4 ... DONE [15:31:51.801] Launching 4 futures (chunks) ... DONE [15:31:51.802] Resolving 4 futures (chunks) ... [15:31:51.802] resolve() on list ... [15:31:51.802] recursive: 0 [15:31:51.802] length: 4 [15:31:51.802] [15:31:51.803] resolved() for 'SequentialFuture' ... [15:31:51.803] - state: 'finished' [15:31:51.803] - run: TRUE [15:31:51.803] - result: 'FutureResult' [15:31:51.804] resolved() for 'SequentialFuture' ... done [15:31:51.804] Future #1 [15:31:51.804] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:51.804] - nx: 4 [15:31:51.804] - relay: TRUE [15:31:51.805] - stdout: TRUE [15:31:51.805] - signal: TRUE [15:31:51.805] - resignal: FALSE [15:31:51.805] - force: TRUE [15:31:51.805] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [15:31:51.805] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [15:31:51.806] - until=1 [15:31:51.806] - relaying element #1 [15:31:51.806] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:51.806] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:51.807] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:51.807] length: 3 (resolved future 1) [15:31:51.807] resolved() for 'SequentialFuture' ... [15:31:51.807] - state: 'finished' [15:31:51.807] - run: TRUE [15:31:51.808] - result: 'FutureResult' [15:31:51.808] resolved() for 'SequentialFuture' ... done [15:31:51.808] Future #2 [15:31:51.808] signalConditionsASAP(SequentialFuture, pos=2) ... [15:31:51.808] - nx: 4 [15:31:51.808] - relay: TRUE [15:31:51.809] - stdout: TRUE [15:31:51.809] - signal: TRUE [15:31:51.809] - resignal: FALSE [15:31:51.809] - force: TRUE [15:31:51.809] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:51.809] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:51.810] - until=2 [15:31:51.810] - relaying element #2 [15:31:51.810] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:51.810] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:51.810] signalConditionsASAP(SequentialFuture, pos=2) ... done [15:31:51.811] length: 2 (resolved future 2) [15:31:51.811] resolved() for 'SequentialFuture' ... [15:31:51.811] - state: 'finished' [15:31:51.811] - run: TRUE [15:31:51.811] - result: 'FutureResult' [15:31:51.812] resolved() for 'SequentialFuture' ... done [15:31:51.812] Future #3 [15:31:51.812] signalConditionsASAP(SequentialFuture, pos=3) ... [15:31:51.812] - nx: 4 [15:31:51.812] - relay: TRUE [15:31:51.813] - stdout: TRUE [15:31:51.813] - signal: TRUE [15:31:51.813] - resignal: FALSE [15:31:51.813] - force: TRUE [15:31:51.813] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:51.813] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:51.814] - until=3 [15:31:51.814] - relaying element #3 [15:31:51.814] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:51.814] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:51.814] signalConditionsASAP(SequentialFuture, pos=3) ... done [15:31:51.815] length: 1 (resolved future 3) [15:31:51.815] resolved() for 'SequentialFuture' ... [15:31:51.815] - state: 'finished' [15:31:51.815] - run: TRUE [15:31:51.815] - result: 'FutureResult' [15:31:51.816] resolved() for 'SequentialFuture' ... done [15:31:51.816] Future #4 [15:31:51.816] signalConditionsASAP(SequentialFuture, pos=4) ... [15:31:51.816] - nx: 4 [15:31:51.816] - relay: TRUE [15:31:51.817] - stdout: TRUE [15:31:51.817] - signal: TRUE [15:31:51.817] - resignal: FALSE [15:31:51.817] - force: TRUE [15:31:51.817] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:51.817] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:51.818] - until=4 [15:31:51.818] - relaying element #4 [15:31:51.818] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:51.818] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:51.818] signalConditionsASAP(SequentialFuture, pos=4) ... done [15:31:51.819] length: 0 (resolved future 4) [15:31:51.819] Relaying remaining futures [15:31:51.819] signalConditionsASAP(NULL, pos=0) ... [15:31:51.819] - nx: 4 [15:31:51.819] - relay: TRUE [15:31:51.819] - stdout: TRUE [15:31:51.820] - signal: TRUE [15:31:51.820] - resignal: FALSE [15:31:51.820] - force: TRUE [15:31:51.820] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:51.820] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [15:31:51.821] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:51.821] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:51.821] signalConditionsASAP(NULL, pos=0) ... done [15:31:51.821] resolve() on list ... DONE [15:31:51.822] - Number of value chunks collected: 4 [15:31:51.822] Resolving 4 futures (chunks) ... DONE [15:31:51.822] Reducing values from 4 chunks ... [15:31:51.822] - Number of values collected after concatenation: 4 [15:31:51.822] - Number of values expected: 4 [15:31:51.822] Reducing values from 4 chunks ... DONE [15:31:51.823] 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 [15:31:51.826] future_lapply() ... [15:31:51.827] Number of chunks: 4 [15:31:51.827] getGlobalsAndPackagesXApply() ... [15:31:51.828] - future.globals: TRUE [15:31:51.828] getGlobalsAndPackages() ... [15:31:51.828] Searching for globals... [15:31:51.830] - globals found: [2] 'FUN', '.Internal' [15:31:51.830] Searching for globals ... DONE [15:31:51.830] Resolving globals: FALSE [15:31:51.831] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:51.831] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:51.831] - globals: [1] 'FUN' [15:31:51.832] [15:31:51.832] getGlobalsAndPackages() ... DONE [15:31:51.832] - globals found/used: [n=1] 'FUN' [15:31:51.832] - needed namespaces: [n=0] [15:31:51.832] Finding globals ... DONE [15:31:51.833] - use_args: TRUE [15:31:51.833] - Getting '...' globals ... [15:31:51.833] resolve() on list ... [15:31:51.834] recursive: 0 [15:31:51.834] length: 1 [15:31:51.834] elements: '...' [15:31:51.834] length: 0 (resolved future 1) [15:31:51.834] resolve() on list ... DONE [15:31:51.835] - '...' content: [n=1] 'length' [15:31:51.835] List of 1 [15:31:51.835] $ ...:List of 1 [15:31:51.835] ..$ length: int 2 [15:31:51.835] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:51.835] - attr(*, "where")=List of 1 [15:31:51.835] ..$ ...: [15:31:51.835] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:51.835] - attr(*, "resolved")= logi TRUE [15:31:51.835] - attr(*, "total_size")= num NA [15:31:51.839] - Getting '...' globals ... DONE [15:31:51.840] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:51.840] List of 2 [15:31:51.840] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:51.840] $ ... :List of 1 [15:31:51.840] ..$ length: int 2 [15:31:51.840] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:51.840] - attr(*, "where")=List of 2 [15:31:51.840] ..$ ...future.FUN: [15:31:51.840] ..$ ... : [15:31:51.840] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:51.840] - attr(*, "resolved")= logi FALSE [15:31:51.840] - attr(*, "total_size")= num 2240 [15:31:51.844] Packages to be attached in all futures: [n=0] [15:31:51.845] getGlobalsAndPackagesXApply() ... DONE [15:31:51.845] Number of futures (= number of chunks): 4 [15:31:51.845] Launching 4 futures (chunks) ... [15:31:51.845] Chunk #1 of 4 ... [15:31:51.846] - Finding globals in 'X' for chunk #1 ... [15:31:51.846] getGlobalsAndPackages() ... [15:31:51.846] Searching for globals... [15:31:51.846] [15:31:51.847] Searching for globals ... DONE [15:31:51.847] - globals: [0] [15:31:51.847] getGlobalsAndPackages() ... DONE [15:31:51.847] + additional globals found: [n=0] [15:31:51.847] + additional namespaces needed: [n=0] [15:31:51.848] - Finding globals in 'X' for chunk #1 ... DONE [15:31:51.848] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:51.848] - seeds: [15:31:51.848] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.848] getGlobalsAndPackages() ... [15:31:51.849] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.849] Resolving globals: FALSE [15:31:51.849] Tweak future expression to call with '...' arguments ... [15:31:51.849] { [15:31:51.849] do.call(function(...) { [15:31:51.849] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.849] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:51.849] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.849] on.exit(options(oopts), add = TRUE) [15:31:51.849] } [15:31:51.849] { [15:31:51.849] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:51.849] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.849] ...future.FUN(...future.X_jj, ...) [15:31:51.849] }) [15:31:51.849] } [15:31:51.849] }, args = future.call.arguments) [15:31:51.849] } [15:31:51.850] Tweak future expression to call with '...' arguments ... DONE [15:31:51.850] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.851] [15:31:51.851] getGlobalsAndPackages() ... DONE [15:31:51.851] run() for 'Future' ... [15:31:51.851] - state: 'created' [15:31:51.852] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:51.852] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:51.852] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:51.853] - Field: 'label' [15:31:51.853] - Field: 'local' [15:31:51.853] - Field: 'owner' [15:31:51.853] - Field: 'envir' [15:31:51.853] - Field: 'packages' [15:31:51.854] - Field: 'gc' [15:31:51.854] - Field: 'conditions' [15:31:51.854] - Field: 'expr' [15:31:51.854] - Field: 'uuid' [15:31:51.854] - Field: 'seed' [15:31:51.854] - Field: 'version' [15:31:51.855] - Field: 'result' [15:31:51.855] - Field: 'asynchronous' [15:31:51.855] - Field: 'calls' [15:31:51.855] - Field: 'globals' [15:31:51.855] - Field: 'stdout' [15:31:51.856] - Field: 'earlySignal' [15:31:51.856] - Field: 'lazy' [15:31:51.856] - Field: 'state' [15:31:51.856] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:51.856] - Launch lazy future ... [15:31:51.857] Packages needed by the future expression (n = 0): [15:31:51.857] Packages needed by future strategies (n = 0): [15:31:51.858] { [15:31:51.858] { [15:31:51.858] { [15:31:51.858] ...future.startTime <- base::Sys.time() [15:31:51.858] { [15:31:51.858] { [15:31:51.858] { [15:31:51.858] base::local({ [15:31:51.858] has_future <- base::requireNamespace("future", [15:31:51.858] quietly = TRUE) [15:31:51.858] if (has_future) { [15:31:51.858] ns <- base::getNamespace("future") [15:31:51.858] version <- ns[[".package"]][["version"]] [15:31:51.858] if (is.null(version)) [15:31:51.858] version <- utils::packageVersion("future") [15:31:51.858] } [15:31:51.858] else { [15:31:51.858] version <- NULL [15:31:51.858] } [15:31:51.858] if (!has_future || version < "1.8.0") { [15:31:51.858] info <- base::c(r_version = base::gsub("R version ", [15:31:51.858] "", base::R.version$version.string), [15:31:51.858] platform = base::sprintf("%s (%s-bit)", [15:31:51.858] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:51.858] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:51.858] "release", "version")], collapse = " "), [15:31:51.858] hostname = base::Sys.info()[["nodename"]]) [15:31:51.858] info <- base::sprintf("%s: %s", base::names(info), [15:31:51.858] info) [15:31:51.858] info <- base::paste(info, collapse = "; ") [15:31:51.858] if (!has_future) { [15:31:51.858] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:51.858] info) [15:31:51.858] } [15:31:51.858] else { [15:31:51.858] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:51.858] info, version) [15:31:51.858] } [15:31:51.858] base::stop(msg) [15:31:51.858] } [15:31:51.858] }) [15:31:51.858] } [15:31:51.858] ...future.strategy.old <- future::plan("list") [15:31:51.858] options(future.plan = NULL) [15:31:51.858] Sys.unsetenv("R_FUTURE_PLAN") [15:31:51.858] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:51.858] } [15:31:51.858] ...future.workdir <- getwd() [15:31:51.858] } [15:31:51.858] ...future.oldOptions <- base::as.list(base::.Options) [15:31:51.858] ...future.oldEnvVars <- base::Sys.getenv() [15:31:51.858] } [15:31:51.858] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:51.858] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:51.858] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:51.858] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:51.858] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:51.858] future.stdout.windows.reencode = NULL, width = 80L) [15:31:51.858] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:51.858] base::names(...future.oldOptions)) [15:31:51.858] } [15:31:51.858] if (FALSE) { [15:31:51.858] } [15:31:51.858] else { [15:31:51.858] if (TRUE) { [15:31:51.858] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:51.858] open = "w") [15:31:51.858] } [15:31:51.858] else { [15:31:51.858] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:51.858] windows = "NUL", "/dev/null"), open = "w") [15:31:51.858] } [15:31:51.858] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:51.858] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:51.858] base::sink(type = "output", split = FALSE) [15:31:51.858] base::close(...future.stdout) [15:31:51.858] }, add = TRUE) [15:31:51.858] } [15:31:51.858] ...future.frame <- base::sys.nframe() [15:31:51.858] ...future.conditions <- base::list() [15:31:51.858] ...future.rng <- base::globalenv()$.Random.seed [15:31:51.858] if (FALSE) { [15:31:51.858] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:51.858] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:51.858] } [15:31:51.858] ...future.result <- base::tryCatch({ [15:31:51.858] base::withCallingHandlers({ [15:31:51.858] ...future.value <- base::withVisible(base::local({ [15:31:51.858] do.call(function(...) { [15:31:51.858] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.858] if (!identical(...future.globals.maxSize.org, [15:31:51.858] ...future.globals.maxSize)) { [15:31:51.858] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.858] on.exit(options(oopts), add = TRUE) [15:31:51.858] } [15:31:51.858] { [15:31:51.858] lapply(seq_along(...future.elements_ii), [15:31:51.858] FUN = function(jj) { [15:31:51.858] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.858] ...future.FUN(...future.X_jj, ...) [15:31:51.858] }) [15:31:51.858] } [15:31:51.858] }, args = future.call.arguments) [15:31:51.858] })) [15:31:51.858] future::FutureResult(value = ...future.value$value, [15:31:51.858] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:51.858] ...future.rng), globalenv = if (FALSE) [15:31:51.858] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:51.858] ...future.globalenv.names)) [15:31:51.858] else NULL, started = ...future.startTime, version = "1.8") [15:31:51.858] }, condition = base::local({ [15:31:51.858] c <- base::c [15:31:51.858] inherits <- base::inherits [15:31:51.858] invokeRestart <- base::invokeRestart [15:31:51.858] length <- base::length [15:31:51.858] list <- base::list [15:31:51.858] seq.int <- base::seq.int [15:31:51.858] signalCondition <- base::signalCondition [15:31:51.858] sys.calls <- base::sys.calls [15:31:51.858] `[[` <- base::`[[` [15:31:51.858] `+` <- base::`+` [15:31:51.858] `<<-` <- base::`<<-` [15:31:51.858] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:51.858] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:51.858] 3L)] [15:31:51.858] } [15:31:51.858] function(cond) { [15:31:51.858] is_error <- inherits(cond, "error") [15:31:51.858] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:51.858] NULL) [15:31:51.858] if (is_error) { [15:31:51.858] sessionInformation <- function() { [15:31:51.858] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:51.858] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:51.858] search = base::search(), system = base::Sys.info()) [15:31:51.858] } [15:31:51.858] ...future.conditions[[length(...future.conditions) + [15:31:51.858] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:51.858] cond$call), session = sessionInformation(), [15:31:51.858] timestamp = base::Sys.time(), signaled = 0L) [15:31:51.858] signalCondition(cond) [15:31:51.858] } [15:31:51.858] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:51.858] "immediateCondition"))) { [15:31:51.858] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:51.858] ...future.conditions[[length(...future.conditions) + [15:31:51.858] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:51.858] if (TRUE && !signal) { [15:31:51.858] muffleCondition <- function (cond, pattern = "^muffle") [15:31:51.858] { [15:31:51.858] inherits <- base::inherits [15:31:51.858] invokeRestart <- base::invokeRestart [15:31:51.858] is.null <- base::is.null [15:31:51.858] muffled <- FALSE [15:31:51.858] if (inherits(cond, "message")) { [15:31:51.858] muffled <- grepl(pattern, "muffleMessage") [15:31:51.858] if (muffled) [15:31:51.858] invokeRestart("muffleMessage") [15:31:51.858] } [15:31:51.858] else if (inherits(cond, "warning")) { [15:31:51.858] muffled <- grepl(pattern, "muffleWarning") [15:31:51.858] if (muffled) [15:31:51.858] invokeRestart("muffleWarning") [15:31:51.858] } [15:31:51.858] else if (inherits(cond, "condition")) { [15:31:51.858] if (!is.null(pattern)) { [15:31:51.858] computeRestarts <- base::computeRestarts [15:31:51.858] grepl <- base::grepl [15:31:51.858] restarts <- computeRestarts(cond) [15:31:51.858] for (restart in restarts) { [15:31:51.858] name <- restart$name [15:31:51.858] if (is.null(name)) [15:31:51.858] next [15:31:51.858] if (!grepl(pattern, name)) [15:31:51.858] next [15:31:51.858] invokeRestart(restart) [15:31:51.858] muffled <- TRUE [15:31:51.858] break [15:31:51.858] } [15:31:51.858] } [15:31:51.858] } [15:31:51.858] invisible(muffled) [15:31:51.858] } [15:31:51.858] muffleCondition(cond, pattern = "^muffle") [15:31:51.858] } [15:31:51.858] } [15:31:51.858] else { [15:31:51.858] if (TRUE) { [15:31:51.858] muffleCondition <- function (cond, pattern = "^muffle") [15:31:51.858] { [15:31:51.858] inherits <- base::inherits [15:31:51.858] invokeRestart <- base::invokeRestart [15:31:51.858] is.null <- base::is.null [15:31:51.858] muffled <- FALSE [15:31:51.858] if (inherits(cond, "message")) { [15:31:51.858] muffled <- grepl(pattern, "muffleMessage") [15:31:51.858] if (muffled) [15:31:51.858] invokeRestart("muffleMessage") [15:31:51.858] } [15:31:51.858] else if (inherits(cond, "warning")) { [15:31:51.858] muffled <- grepl(pattern, "muffleWarning") [15:31:51.858] if (muffled) [15:31:51.858] invokeRestart("muffleWarning") [15:31:51.858] } [15:31:51.858] else if (inherits(cond, "condition")) { [15:31:51.858] if (!is.null(pattern)) { [15:31:51.858] computeRestarts <- base::computeRestarts [15:31:51.858] grepl <- base::grepl [15:31:51.858] restarts <- computeRestarts(cond) [15:31:51.858] for (restart in restarts) { [15:31:51.858] name <- restart$name [15:31:51.858] if (is.null(name)) [15:31:51.858] next [15:31:51.858] if (!grepl(pattern, name)) [15:31:51.858] next [15:31:51.858] invokeRestart(restart) [15:31:51.858] muffled <- TRUE [15:31:51.858] break [15:31:51.858] } [15:31:51.858] } [15:31:51.858] } [15:31:51.858] invisible(muffled) [15:31:51.858] } [15:31:51.858] muffleCondition(cond, pattern = "^muffle") [15:31:51.858] } [15:31:51.858] } [15:31:51.858] } [15:31:51.858] })) [15:31:51.858] }, error = function(ex) { [15:31:51.858] base::structure(base::list(value = NULL, visible = NULL, [15:31:51.858] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:51.858] ...future.rng), started = ...future.startTime, [15:31:51.858] finished = Sys.time(), session_uuid = NA_character_, [15:31:51.858] version = "1.8"), class = "FutureResult") [15:31:51.858] }, finally = { [15:31:51.858] if (!identical(...future.workdir, getwd())) [15:31:51.858] setwd(...future.workdir) [15:31:51.858] { [15:31:51.858] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:51.858] ...future.oldOptions$nwarnings <- NULL [15:31:51.858] } [15:31:51.858] base::options(...future.oldOptions) [15:31:51.858] if (.Platform$OS.type == "windows") { [15:31:51.858] old_names <- names(...future.oldEnvVars) [15:31:51.858] envs <- base::Sys.getenv() [15:31:51.858] names <- names(envs) [15:31:51.858] common <- intersect(names, old_names) [15:31:51.858] added <- setdiff(names, old_names) [15:31:51.858] removed <- setdiff(old_names, names) [15:31:51.858] changed <- common[...future.oldEnvVars[common] != [15:31:51.858] envs[common]] [15:31:51.858] NAMES <- toupper(changed) [15:31:51.858] args <- list() [15:31:51.858] for (kk in seq_along(NAMES)) { [15:31:51.858] name <- changed[[kk]] [15:31:51.858] NAME <- NAMES[[kk]] [15:31:51.858] if (name != NAME && is.element(NAME, old_names)) [15:31:51.858] next [15:31:51.858] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:51.858] } [15:31:51.858] NAMES <- toupper(added) [15:31:51.858] for (kk in seq_along(NAMES)) { [15:31:51.858] name <- added[[kk]] [15:31:51.858] NAME <- NAMES[[kk]] [15:31:51.858] if (name != NAME && is.element(NAME, old_names)) [15:31:51.858] next [15:31:51.858] args[[name]] <- "" [15:31:51.858] } [15:31:51.858] NAMES <- toupper(removed) [15:31:51.858] for (kk in seq_along(NAMES)) { [15:31:51.858] name <- removed[[kk]] [15:31:51.858] NAME <- NAMES[[kk]] [15:31:51.858] if (name != NAME && is.element(NAME, old_names)) [15:31:51.858] next [15:31:51.858] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:51.858] } [15:31:51.858] if (length(args) > 0) [15:31:51.858] base::do.call(base::Sys.setenv, args = args) [15:31:51.858] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:51.858] } [15:31:51.858] else { [15:31:51.858] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:51.858] } [15:31:51.858] { [15:31:51.858] if (base::length(...future.futureOptionsAdded) > [15:31:51.858] 0L) { [15:31:51.858] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:51.858] base::names(opts) <- ...future.futureOptionsAdded [15:31:51.858] base::options(opts) [15:31:51.858] } [15:31:51.858] { [15:31:51.858] { [15:31:51.858] NULL [15:31:51.858] RNGkind("Mersenne-Twister") [15:31:51.858] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:51.858] inherits = FALSE) [15:31:51.858] } [15:31:51.858] options(future.plan = NULL) [15:31:51.858] if (is.na(NA_character_)) [15:31:51.858] Sys.unsetenv("R_FUTURE_PLAN") [15:31:51.858] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:51.858] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:51.858] .init = FALSE) [15:31:51.858] } [15:31:51.858] } [15:31:51.858] } [15:31:51.858] }) [15:31:51.858] if (TRUE) { [15:31:51.858] base::sink(type = "output", split = FALSE) [15:31:51.858] if (TRUE) { [15:31:51.858] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:51.858] } [15:31:51.858] else { [15:31:51.858] ...future.result["stdout"] <- base::list(NULL) [15:31:51.858] } [15:31:51.858] base::close(...future.stdout) [15:31:51.858] ...future.stdout <- NULL [15:31:51.858] } [15:31:51.858] ...future.result$conditions <- ...future.conditions [15:31:51.858] ...future.result$finished <- base::Sys.time() [15:31:51.858] ...future.result [15:31:51.858] } [15:31:51.865] assign_globals() ... [15:31:51.865] List of 5 [15:31:51.865] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:51.865] $ future.call.arguments :List of 1 [15:31:51.865] ..$ length: int 2 [15:31:51.865] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:51.865] $ ...future.elements_ii :List of 1 [15:31:51.865] ..$ a: chr "integer" [15:31:51.865] $ ...future.seeds_ii : NULL [15:31:51.865] $ ...future.globals.maxSize: NULL [15:31:51.865] - attr(*, "where")=List of 5 [15:31:51.865] ..$ ...future.FUN : [15:31:51.865] ..$ future.call.arguments : [15:31:51.865] ..$ ...future.elements_ii : [15:31:51.865] ..$ ...future.seeds_ii : [15:31:51.865] ..$ ...future.globals.maxSize: [15:31:51.865] - attr(*, "resolved")= logi FALSE [15:31:51.865] - attr(*, "total_size")= num 2240 [15:31:51.865] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:51.865] - attr(*, "already-done")= logi TRUE [15:31:51.877] - copied '...future.FUN' to environment [15:31:51.877] - copied 'future.call.arguments' to environment [15:31:51.877] - copied '...future.elements_ii' to environment [15:31:51.878] - copied '...future.seeds_ii' to environment [15:31:51.878] - copied '...future.globals.maxSize' to environment [15:31:51.878] assign_globals() ... done [15:31:51.879] plan(): Setting new future strategy stack: [15:31:51.879] List of future strategies: [15:31:51.879] 1. sequential: [15:31:51.879] - args: function (..., envir = parent.frame(), workers = "") [15:31:51.879] - tweaked: FALSE [15:31:51.879] - call: NULL [15:31:51.880] plan(): nbrOfWorkers() = 1 [15:31:51.883] plan(): Setting new future strategy stack: [15:31:51.883] List of future strategies: [15:31:51.883] 1. sequential: [15:31:51.883] - args: function (..., envir = parent.frame(), workers = "") [15:31:51.883] - tweaked: FALSE [15:31:51.883] - call: plan(strategy) [15:31:51.884] plan(): nbrOfWorkers() = 1 [15:31:51.885] SequentialFuture started (and completed) [15:31:51.885] - Launch lazy future ... done [15:31:51.886] run() for 'SequentialFuture' ... done [15:31:51.886] Created future: [15:31:51.886] SequentialFuture: [15:31:51.886] Label: 'future_lapply-1' [15:31:51.886] Expression: [15:31:51.886] { [15:31:51.886] do.call(function(...) { [15:31:51.886] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.886] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:51.886] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.886] on.exit(options(oopts), add = TRUE) [15:31:51.886] } [15:31:51.886] { [15:31:51.886] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:51.886] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.886] ...future.FUN(...future.X_jj, ...) [15:31:51.886] }) [15:31:51.886] } [15:31:51.886] }, args = future.call.arguments) [15:31:51.886] } [15:31:51.886] Lazy evaluation: FALSE [15:31:51.886] Asynchronous evaluation: FALSE [15:31:51.886] Local evaluation: TRUE [15:31:51.886] Environment: R_GlobalEnv [15:31:51.886] Capture standard output: TRUE [15:31:51.886] Capture condition classes: 'condition' (excluding 'nothing') [15:31:51.886] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:51.886] Packages: [15:31:51.886] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:51.886] Resolved: TRUE [15:31:51.886] Value: 56 bytes of class 'list' [15:31:51.886] Early signaling: FALSE [15:31:51.886] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:51.886] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:51.889] Chunk #1 of 4 ... DONE [15:31:51.889] Chunk #2 of 4 ... [15:31:51.890] - Finding globals in 'X' for chunk #2 ... [15:31:51.890] getGlobalsAndPackages() ... [15:31:51.890] Searching for globals... [15:31:51.891] [15:31:51.891] Searching for globals ... DONE [15:31:51.892] - globals: [0] [15:31:51.892] getGlobalsAndPackages() ... DONE [15:31:51.892] + additional globals found: [n=0] [15:31:51.892] + additional namespaces needed: [n=0] [15:31:51.893] - Finding globals in 'X' for chunk #2 ... DONE [15:31:51.893] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:51.893] - seeds: [15:31:51.894] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.894] getGlobalsAndPackages() ... [15:31:51.894] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.895] Resolving globals: FALSE [15:31:51.895] Tweak future expression to call with '...' arguments ... [15:31:51.895] { [15:31:51.895] do.call(function(...) { [15:31:51.895] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.895] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:51.895] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.895] on.exit(options(oopts), add = TRUE) [15:31:51.895] } [15:31:51.895] { [15:31:51.895] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:51.895] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.895] ...future.FUN(...future.X_jj, ...) [15:31:51.895] }) [15:31:51.895] } [15:31:51.895] }, args = future.call.arguments) [15:31:51.895] } [15:31:51.896] Tweak future expression to call with '...' arguments ... DONE [15:31:51.897] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.897] [15:31:51.897] getGlobalsAndPackages() ... DONE [15:31:51.898] run() for 'Future' ... [15:31:51.898] - state: 'created' [15:31:51.898] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:51.899] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:51.899] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:51.899] - Field: 'label' [15:31:51.899] - Field: 'local' [15:31:51.900] - Field: 'owner' [15:31:51.900] - Field: 'envir' [15:31:51.900] - Field: 'packages' [15:31:51.900] - Field: 'gc' [15:31:51.900] - Field: 'conditions' [15:31:51.901] - Field: 'expr' [15:31:51.901] - Field: 'uuid' [15:31:51.901] - Field: 'seed' [15:31:51.901] - Field: 'version' [15:31:51.901] - Field: 'result' [15:31:51.902] - Field: 'asynchronous' [15:31:51.902] - Field: 'calls' [15:31:51.902] - Field: 'globals' [15:31:51.902] - Field: 'stdout' [15:31:51.902] - Field: 'earlySignal' [15:31:51.902] - Field: 'lazy' [15:31:51.903] - Field: 'state' [15:31:51.903] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:51.903] - Launch lazy future ... [15:31:51.903] Packages needed by the future expression (n = 0): [15:31:51.904] Packages needed by future strategies (n = 0): [15:31:51.904] { [15:31:51.904] { [15:31:51.904] { [15:31:51.904] ...future.startTime <- base::Sys.time() [15:31:51.904] { [15:31:51.904] { [15:31:51.904] { [15:31:51.904] base::local({ [15:31:51.904] has_future <- base::requireNamespace("future", [15:31:51.904] quietly = TRUE) [15:31:51.904] if (has_future) { [15:31:51.904] ns <- base::getNamespace("future") [15:31:51.904] version <- ns[[".package"]][["version"]] [15:31:51.904] if (is.null(version)) [15:31:51.904] version <- utils::packageVersion("future") [15:31:51.904] } [15:31:51.904] else { [15:31:51.904] version <- NULL [15:31:51.904] } [15:31:51.904] if (!has_future || version < "1.8.0") { [15:31:51.904] info <- base::c(r_version = base::gsub("R version ", [15:31:51.904] "", base::R.version$version.string), [15:31:51.904] platform = base::sprintf("%s (%s-bit)", [15:31:51.904] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:51.904] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:51.904] "release", "version")], collapse = " "), [15:31:51.904] hostname = base::Sys.info()[["nodename"]]) [15:31:51.904] info <- base::sprintf("%s: %s", base::names(info), [15:31:51.904] info) [15:31:51.904] info <- base::paste(info, collapse = "; ") [15:31:51.904] if (!has_future) { [15:31:51.904] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:51.904] info) [15:31:51.904] } [15:31:51.904] else { [15:31:51.904] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:51.904] info, version) [15:31:51.904] } [15:31:51.904] base::stop(msg) [15:31:51.904] } [15:31:51.904] }) [15:31:51.904] } [15:31:51.904] ...future.strategy.old <- future::plan("list") [15:31:51.904] options(future.plan = NULL) [15:31:51.904] Sys.unsetenv("R_FUTURE_PLAN") [15:31:51.904] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:51.904] } [15:31:51.904] ...future.workdir <- getwd() [15:31:51.904] } [15:31:51.904] ...future.oldOptions <- base::as.list(base::.Options) [15:31:51.904] ...future.oldEnvVars <- base::Sys.getenv() [15:31:51.904] } [15:31:51.904] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:51.904] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:51.904] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:51.904] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:51.904] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:51.904] future.stdout.windows.reencode = NULL, width = 80L) [15:31:51.904] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:51.904] base::names(...future.oldOptions)) [15:31:51.904] } [15:31:51.904] if (FALSE) { [15:31:51.904] } [15:31:51.904] else { [15:31:51.904] if (TRUE) { [15:31:51.904] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:51.904] open = "w") [15:31:51.904] } [15:31:51.904] else { [15:31:51.904] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:51.904] windows = "NUL", "/dev/null"), open = "w") [15:31:51.904] } [15:31:51.904] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:51.904] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:51.904] base::sink(type = "output", split = FALSE) [15:31:51.904] base::close(...future.stdout) [15:31:51.904] }, add = TRUE) [15:31:51.904] } [15:31:51.904] ...future.frame <- base::sys.nframe() [15:31:51.904] ...future.conditions <- base::list() [15:31:51.904] ...future.rng <- base::globalenv()$.Random.seed [15:31:51.904] if (FALSE) { [15:31:51.904] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:51.904] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:51.904] } [15:31:51.904] ...future.result <- base::tryCatch({ [15:31:51.904] base::withCallingHandlers({ [15:31:51.904] ...future.value <- base::withVisible(base::local({ [15:31:51.904] do.call(function(...) { [15:31:51.904] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.904] if (!identical(...future.globals.maxSize.org, [15:31:51.904] ...future.globals.maxSize)) { [15:31:51.904] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.904] on.exit(options(oopts), add = TRUE) [15:31:51.904] } [15:31:51.904] { [15:31:51.904] lapply(seq_along(...future.elements_ii), [15:31:51.904] FUN = function(jj) { [15:31:51.904] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.904] ...future.FUN(...future.X_jj, ...) [15:31:51.904] }) [15:31:51.904] } [15:31:51.904] }, args = future.call.arguments) [15:31:51.904] })) [15:31:51.904] future::FutureResult(value = ...future.value$value, [15:31:51.904] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:51.904] ...future.rng), globalenv = if (FALSE) [15:31:51.904] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:51.904] ...future.globalenv.names)) [15:31:51.904] else NULL, started = ...future.startTime, version = "1.8") [15:31:51.904] }, condition = base::local({ [15:31:51.904] c <- base::c [15:31:51.904] inherits <- base::inherits [15:31:51.904] invokeRestart <- base::invokeRestart [15:31:51.904] length <- base::length [15:31:51.904] list <- base::list [15:31:51.904] seq.int <- base::seq.int [15:31:51.904] signalCondition <- base::signalCondition [15:31:51.904] sys.calls <- base::sys.calls [15:31:51.904] `[[` <- base::`[[` [15:31:51.904] `+` <- base::`+` [15:31:51.904] `<<-` <- base::`<<-` [15:31:51.904] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:51.904] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:51.904] 3L)] [15:31:51.904] } [15:31:51.904] function(cond) { [15:31:51.904] is_error <- inherits(cond, "error") [15:31:51.904] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:51.904] NULL) [15:31:51.904] if (is_error) { [15:31:51.904] sessionInformation <- function() { [15:31:51.904] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:51.904] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:51.904] search = base::search(), system = base::Sys.info()) [15:31:51.904] } [15:31:51.904] ...future.conditions[[length(...future.conditions) + [15:31:51.904] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:51.904] cond$call), session = sessionInformation(), [15:31:51.904] timestamp = base::Sys.time(), signaled = 0L) [15:31:51.904] signalCondition(cond) [15:31:51.904] } [15:31:51.904] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:51.904] "immediateCondition"))) { [15:31:51.904] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:51.904] ...future.conditions[[length(...future.conditions) + [15:31:51.904] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:51.904] if (TRUE && !signal) { [15:31:51.904] muffleCondition <- function (cond, pattern = "^muffle") [15:31:51.904] { [15:31:51.904] inherits <- base::inherits [15:31:51.904] invokeRestart <- base::invokeRestart [15:31:51.904] is.null <- base::is.null [15:31:51.904] muffled <- FALSE [15:31:51.904] if (inherits(cond, "message")) { [15:31:51.904] muffled <- grepl(pattern, "muffleMessage") [15:31:51.904] if (muffled) [15:31:51.904] invokeRestart("muffleMessage") [15:31:51.904] } [15:31:51.904] else if (inherits(cond, "warning")) { [15:31:51.904] muffled <- grepl(pattern, "muffleWarning") [15:31:51.904] if (muffled) [15:31:51.904] invokeRestart("muffleWarning") [15:31:51.904] } [15:31:51.904] else if (inherits(cond, "condition")) { [15:31:51.904] if (!is.null(pattern)) { [15:31:51.904] computeRestarts <- base::computeRestarts [15:31:51.904] grepl <- base::grepl [15:31:51.904] restarts <- computeRestarts(cond) [15:31:51.904] for (restart in restarts) { [15:31:51.904] name <- restart$name [15:31:51.904] if (is.null(name)) [15:31:51.904] next [15:31:51.904] if (!grepl(pattern, name)) [15:31:51.904] next [15:31:51.904] invokeRestart(restart) [15:31:51.904] muffled <- TRUE [15:31:51.904] break [15:31:51.904] } [15:31:51.904] } [15:31:51.904] } [15:31:51.904] invisible(muffled) [15:31:51.904] } [15:31:51.904] muffleCondition(cond, pattern = "^muffle") [15:31:51.904] } [15:31:51.904] } [15:31:51.904] else { [15:31:51.904] if (TRUE) { [15:31:51.904] muffleCondition <- function (cond, pattern = "^muffle") [15:31:51.904] { [15:31:51.904] inherits <- base::inherits [15:31:51.904] invokeRestart <- base::invokeRestart [15:31:51.904] is.null <- base::is.null [15:31:51.904] muffled <- FALSE [15:31:51.904] if (inherits(cond, "message")) { [15:31:51.904] muffled <- grepl(pattern, "muffleMessage") [15:31:51.904] if (muffled) [15:31:51.904] invokeRestart("muffleMessage") [15:31:51.904] } [15:31:51.904] else if (inherits(cond, "warning")) { [15:31:51.904] muffled <- grepl(pattern, "muffleWarning") [15:31:51.904] if (muffled) [15:31:51.904] invokeRestart("muffleWarning") [15:31:51.904] } [15:31:51.904] else if (inherits(cond, "condition")) { [15:31:51.904] if (!is.null(pattern)) { [15:31:51.904] computeRestarts <- base::computeRestarts [15:31:51.904] grepl <- base::grepl [15:31:51.904] restarts <- computeRestarts(cond) [15:31:51.904] for (restart in restarts) { [15:31:51.904] name <- restart$name [15:31:51.904] if (is.null(name)) [15:31:51.904] next [15:31:51.904] if (!grepl(pattern, name)) [15:31:51.904] next [15:31:51.904] invokeRestart(restart) [15:31:51.904] muffled <- TRUE [15:31:51.904] break [15:31:51.904] } [15:31:51.904] } [15:31:51.904] } [15:31:51.904] invisible(muffled) [15:31:51.904] } [15:31:51.904] muffleCondition(cond, pattern = "^muffle") [15:31:51.904] } [15:31:51.904] } [15:31:51.904] } [15:31:51.904] })) [15:31:51.904] }, error = function(ex) { [15:31:51.904] base::structure(base::list(value = NULL, visible = NULL, [15:31:51.904] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:51.904] ...future.rng), started = ...future.startTime, [15:31:51.904] finished = Sys.time(), session_uuid = NA_character_, [15:31:51.904] version = "1.8"), class = "FutureResult") [15:31:51.904] }, finally = { [15:31:51.904] if (!identical(...future.workdir, getwd())) [15:31:51.904] setwd(...future.workdir) [15:31:51.904] { [15:31:51.904] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:51.904] ...future.oldOptions$nwarnings <- NULL [15:31:51.904] } [15:31:51.904] base::options(...future.oldOptions) [15:31:51.904] if (.Platform$OS.type == "windows") { [15:31:51.904] old_names <- names(...future.oldEnvVars) [15:31:51.904] envs <- base::Sys.getenv() [15:31:51.904] names <- names(envs) [15:31:51.904] common <- intersect(names, old_names) [15:31:51.904] added <- setdiff(names, old_names) [15:31:51.904] removed <- setdiff(old_names, names) [15:31:51.904] changed <- common[...future.oldEnvVars[common] != [15:31:51.904] envs[common]] [15:31:51.904] NAMES <- toupper(changed) [15:31:51.904] args <- list() [15:31:51.904] for (kk in seq_along(NAMES)) { [15:31:51.904] name <- changed[[kk]] [15:31:51.904] NAME <- NAMES[[kk]] [15:31:51.904] if (name != NAME && is.element(NAME, old_names)) [15:31:51.904] next [15:31:51.904] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:51.904] } [15:31:51.904] NAMES <- toupper(added) [15:31:51.904] for (kk in seq_along(NAMES)) { [15:31:51.904] name <- added[[kk]] [15:31:51.904] NAME <- NAMES[[kk]] [15:31:51.904] if (name != NAME && is.element(NAME, old_names)) [15:31:51.904] next [15:31:51.904] args[[name]] <- "" [15:31:51.904] } [15:31:51.904] NAMES <- toupper(removed) [15:31:51.904] for (kk in seq_along(NAMES)) { [15:31:51.904] name <- removed[[kk]] [15:31:51.904] NAME <- NAMES[[kk]] [15:31:51.904] if (name != NAME && is.element(NAME, old_names)) [15:31:51.904] next [15:31:51.904] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:51.904] } [15:31:51.904] if (length(args) > 0) [15:31:51.904] base::do.call(base::Sys.setenv, args = args) [15:31:51.904] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:51.904] } [15:31:51.904] else { [15:31:51.904] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:51.904] } [15:31:51.904] { [15:31:51.904] if (base::length(...future.futureOptionsAdded) > [15:31:51.904] 0L) { [15:31:51.904] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:51.904] base::names(opts) <- ...future.futureOptionsAdded [15:31:51.904] base::options(opts) [15:31:51.904] } [15:31:51.904] { [15:31:51.904] { [15:31:51.904] NULL [15:31:51.904] RNGkind("Mersenne-Twister") [15:31:51.904] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:51.904] inherits = FALSE) [15:31:51.904] } [15:31:51.904] options(future.plan = NULL) [15:31:51.904] if (is.na(NA_character_)) [15:31:51.904] Sys.unsetenv("R_FUTURE_PLAN") [15:31:51.904] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:51.904] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:51.904] .init = FALSE) [15:31:51.904] } [15:31:51.904] } [15:31:51.904] } [15:31:51.904] }) [15:31:51.904] if (TRUE) { [15:31:51.904] base::sink(type = "output", split = FALSE) [15:31:51.904] if (TRUE) { [15:31:51.904] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:51.904] } [15:31:51.904] else { [15:31:51.904] ...future.result["stdout"] <- base::list(NULL) [15:31:51.904] } [15:31:51.904] base::close(...future.stdout) [15:31:51.904] ...future.stdout <- NULL [15:31:51.904] } [15:31:51.904] ...future.result$conditions <- ...future.conditions [15:31:51.904] ...future.result$finished <- base::Sys.time() [15:31:51.904] ...future.result [15:31:51.904] } [15:31:51.910] assign_globals() ... [15:31:51.910] List of 5 [15:31:51.910] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:51.910] $ future.call.arguments :List of 1 [15:31:51.910] ..$ length: int 2 [15:31:51.910] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:51.910] $ ...future.elements_ii :List of 1 [15:31:51.910] ..$ b: chr "numeric" [15:31:51.910] $ ...future.seeds_ii : NULL [15:31:51.910] $ ...future.globals.maxSize: NULL [15:31:51.910] - attr(*, "where")=List of 5 [15:31:51.910] ..$ ...future.FUN : [15:31:51.910] ..$ future.call.arguments : [15:31:51.910] ..$ ...future.elements_ii : [15:31:51.910] ..$ ...future.seeds_ii : [15:31:51.910] ..$ ...future.globals.maxSize: [15:31:51.910] - attr(*, "resolved")= logi FALSE [15:31:51.910] - attr(*, "total_size")= num 2240 [15:31:51.910] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:51.910] - attr(*, "already-done")= logi TRUE [15:31:51.917] - copied '...future.FUN' to environment [15:31:51.918] - copied 'future.call.arguments' to environment [15:31:51.918] - copied '...future.elements_ii' to environment [15:31:51.918] - copied '...future.seeds_ii' to environment [15:31:51.918] - copied '...future.globals.maxSize' to environment [15:31:51.918] assign_globals() ... done [15:31:51.919] plan(): Setting new future strategy stack: [15:31:51.919] List of future strategies: [15:31:51.919] 1. sequential: [15:31:51.919] - args: function (..., envir = parent.frame(), workers = "") [15:31:51.919] - tweaked: FALSE [15:31:51.919] - call: NULL [15:31:51.920] plan(): nbrOfWorkers() = 1 [15:31:51.922] plan(): Setting new future strategy stack: [15:31:51.922] List of future strategies: [15:31:51.922] 1. sequential: [15:31:51.922] - args: function (..., envir = parent.frame(), workers = "") [15:31:51.922] - tweaked: FALSE [15:31:51.922] - call: plan(strategy) [15:31:51.923] plan(): nbrOfWorkers() = 1 [15:31:51.923] SequentialFuture started (and completed) [15:31:51.923] - Launch lazy future ... done [15:31:51.924] run() for 'SequentialFuture' ... done [15:31:51.924] Created future: [15:31:51.924] SequentialFuture: [15:31:51.924] Label: 'future_lapply-2' [15:31:51.924] Expression: [15:31:51.924] { [15:31:51.924] do.call(function(...) { [15:31:51.924] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.924] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:51.924] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.924] on.exit(options(oopts), add = TRUE) [15:31:51.924] } [15:31:51.924] { [15:31:51.924] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:51.924] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.924] ...future.FUN(...future.X_jj, ...) [15:31:51.924] }) [15:31:51.924] } [15:31:51.924] }, args = future.call.arguments) [15:31:51.924] } [15:31:51.924] Lazy evaluation: FALSE [15:31:51.924] Asynchronous evaluation: FALSE [15:31:51.924] Local evaluation: TRUE [15:31:51.924] Environment: R_GlobalEnv [15:31:51.924] Capture standard output: TRUE [15:31:51.924] Capture condition classes: 'condition' (excluding 'nothing') [15:31:51.924] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:51.924] Packages: [15:31:51.924] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:51.924] Resolved: TRUE [15:31:51.924] Value: 64 bytes of class 'list' [15:31:51.924] Early signaling: FALSE [15:31:51.924] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:51.924] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:51.926] Chunk #2 of 4 ... DONE [15:31:51.926] Chunk #3 of 4 ... [15:31:51.926] - Finding globals in 'X' for chunk #3 ... [15:31:51.926] getGlobalsAndPackages() ... [15:31:51.927] Searching for globals... [15:31:51.927] [15:31:51.927] Searching for globals ... DONE [15:31:51.927] - globals: [0] [15:31:51.928] getGlobalsAndPackages() ... DONE [15:31:51.928] + additional globals found: [n=0] [15:31:51.928] + additional namespaces needed: [n=0] [15:31:51.928] - Finding globals in 'X' for chunk #3 ... DONE [15:31:51.928] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:51.929] - seeds: [15:31:51.929] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.929] getGlobalsAndPackages() ... [15:31:51.929] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.930] Resolving globals: FALSE [15:31:51.930] Tweak future expression to call with '...' arguments ... [15:31:51.930] { [15:31:51.930] do.call(function(...) { [15:31:51.930] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.930] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:51.930] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.930] on.exit(options(oopts), add = TRUE) [15:31:51.930] } [15:31:51.930] { [15:31:51.930] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:51.930] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.930] ...future.FUN(...future.X_jj, ...) [15:31:51.930] }) [15:31:51.930] } [15:31:51.930] }, args = future.call.arguments) [15:31:51.930] } [15:31:51.931] Tweak future expression to call with '...' arguments ... DONE [15:31:51.931] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.932] [15:31:51.932] getGlobalsAndPackages() ... DONE [15:31:51.932] run() for 'Future' ... [15:31:51.933] - state: 'created' [15:31:51.933] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:51.933] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:51.934] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:51.934] - Field: 'label' [15:31:51.934] - Field: 'local' [15:31:51.934] - Field: 'owner' [15:31:51.934] - Field: 'envir' [15:31:51.935] - Field: 'packages' [15:31:51.935] - Field: 'gc' [15:31:51.935] - Field: 'conditions' [15:31:51.935] - Field: 'expr' [15:31:51.935] - Field: 'uuid' [15:31:51.936] - Field: 'seed' [15:31:51.936] - Field: 'version' [15:31:51.936] - Field: 'result' [15:31:51.936] - Field: 'asynchronous' [15:31:51.937] - Field: 'calls' [15:31:51.937] - Field: 'globals' [15:31:51.938] - Field: 'stdout' [15:31:51.941] - Field: 'earlySignal' [15:31:51.942] - Field: 'lazy' [15:31:51.942] - Field: 'state' [15:31:51.943] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:51.943] - Launch lazy future ... [15:31:51.944] Packages needed by the future expression (n = 0): [15:31:51.944] Packages needed by future strategies (n = 0): [15:31:51.945] { [15:31:51.945] { [15:31:51.945] { [15:31:51.945] ...future.startTime <- base::Sys.time() [15:31:51.945] { [15:31:51.945] { [15:31:51.945] { [15:31:51.945] base::local({ [15:31:51.945] has_future <- base::requireNamespace("future", [15:31:51.945] quietly = TRUE) [15:31:51.945] if (has_future) { [15:31:51.945] ns <- base::getNamespace("future") [15:31:51.945] version <- ns[[".package"]][["version"]] [15:31:51.945] if (is.null(version)) [15:31:51.945] version <- utils::packageVersion("future") [15:31:51.945] } [15:31:51.945] else { [15:31:51.945] version <- NULL [15:31:51.945] } [15:31:51.945] if (!has_future || version < "1.8.0") { [15:31:51.945] info <- base::c(r_version = base::gsub("R version ", [15:31:51.945] "", base::R.version$version.string), [15:31:51.945] platform = base::sprintf("%s (%s-bit)", [15:31:51.945] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:51.945] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:51.945] "release", "version")], collapse = " "), [15:31:51.945] hostname = base::Sys.info()[["nodename"]]) [15:31:51.945] info <- base::sprintf("%s: %s", base::names(info), [15:31:51.945] info) [15:31:51.945] info <- base::paste(info, collapse = "; ") [15:31:51.945] if (!has_future) { [15:31:51.945] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:51.945] info) [15:31:51.945] } [15:31:51.945] else { [15:31:51.945] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:51.945] info, version) [15:31:51.945] } [15:31:51.945] base::stop(msg) [15:31:51.945] } [15:31:51.945] }) [15:31:51.945] } [15:31:51.945] ...future.strategy.old <- future::plan("list") [15:31:51.945] options(future.plan = NULL) [15:31:51.945] Sys.unsetenv("R_FUTURE_PLAN") [15:31:51.945] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:51.945] } [15:31:51.945] ...future.workdir <- getwd() [15:31:51.945] } [15:31:51.945] ...future.oldOptions <- base::as.list(base::.Options) [15:31:51.945] ...future.oldEnvVars <- base::Sys.getenv() [15:31:51.945] } [15:31:51.945] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:51.945] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:51.945] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:51.945] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:51.945] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:51.945] future.stdout.windows.reencode = NULL, width = 80L) [15:31:51.945] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:51.945] base::names(...future.oldOptions)) [15:31:51.945] } [15:31:51.945] if (FALSE) { [15:31:51.945] } [15:31:51.945] else { [15:31:51.945] if (TRUE) { [15:31:51.945] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:51.945] open = "w") [15:31:51.945] } [15:31:51.945] else { [15:31:51.945] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:51.945] windows = "NUL", "/dev/null"), open = "w") [15:31:51.945] } [15:31:51.945] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:51.945] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:51.945] base::sink(type = "output", split = FALSE) [15:31:51.945] base::close(...future.stdout) [15:31:51.945] }, add = TRUE) [15:31:51.945] } [15:31:51.945] ...future.frame <- base::sys.nframe() [15:31:51.945] ...future.conditions <- base::list() [15:31:51.945] ...future.rng <- base::globalenv()$.Random.seed [15:31:51.945] if (FALSE) { [15:31:51.945] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:51.945] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:51.945] } [15:31:51.945] ...future.result <- base::tryCatch({ [15:31:51.945] base::withCallingHandlers({ [15:31:51.945] ...future.value <- base::withVisible(base::local({ [15:31:51.945] do.call(function(...) { [15:31:51.945] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.945] if (!identical(...future.globals.maxSize.org, [15:31:51.945] ...future.globals.maxSize)) { [15:31:51.945] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.945] on.exit(options(oopts), add = TRUE) [15:31:51.945] } [15:31:51.945] { [15:31:51.945] lapply(seq_along(...future.elements_ii), [15:31:51.945] FUN = function(jj) { [15:31:51.945] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.945] ...future.FUN(...future.X_jj, ...) [15:31:51.945] }) [15:31:51.945] } [15:31:51.945] }, args = future.call.arguments) [15:31:51.945] })) [15:31:51.945] future::FutureResult(value = ...future.value$value, [15:31:51.945] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:51.945] ...future.rng), globalenv = if (FALSE) [15:31:51.945] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:51.945] ...future.globalenv.names)) [15:31:51.945] else NULL, started = ...future.startTime, version = "1.8") [15:31:51.945] }, condition = base::local({ [15:31:51.945] c <- base::c [15:31:51.945] inherits <- base::inherits [15:31:51.945] invokeRestart <- base::invokeRestart [15:31:51.945] length <- base::length [15:31:51.945] list <- base::list [15:31:51.945] seq.int <- base::seq.int [15:31:51.945] signalCondition <- base::signalCondition [15:31:51.945] sys.calls <- base::sys.calls [15:31:51.945] `[[` <- base::`[[` [15:31:51.945] `+` <- base::`+` [15:31:51.945] `<<-` <- base::`<<-` [15:31:51.945] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:51.945] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:51.945] 3L)] [15:31:51.945] } [15:31:51.945] function(cond) { [15:31:51.945] is_error <- inherits(cond, "error") [15:31:51.945] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:51.945] NULL) [15:31:51.945] if (is_error) { [15:31:51.945] sessionInformation <- function() { [15:31:51.945] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:51.945] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:51.945] search = base::search(), system = base::Sys.info()) [15:31:51.945] } [15:31:51.945] ...future.conditions[[length(...future.conditions) + [15:31:51.945] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:51.945] cond$call), session = sessionInformation(), [15:31:51.945] timestamp = base::Sys.time(), signaled = 0L) [15:31:51.945] signalCondition(cond) [15:31:51.945] } [15:31:51.945] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:51.945] "immediateCondition"))) { [15:31:51.945] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:51.945] ...future.conditions[[length(...future.conditions) + [15:31:51.945] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:51.945] if (TRUE && !signal) { [15:31:51.945] muffleCondition <- function (cond, pattern = "^muffle") [15:31:51.945] { [15:31:51.945] inherits <- base::inherits [15:31:51.945] invokeRestart <- base::invokeRestart [15:31:51.945] is.null <- base::is.null [15:31:51.945] muffled <- FALSE [15:31:51.945] if (inherits(cond, "message")) { [15:31:51.945] muffled <- grepl(pattern, "muffleMessage") [15:31:51.945] if (muffled) [15:31:51.945] invokeRestart("muffleMessage") [15:31:51.945] } [15:31:51.945] else if (inherits(cond, "warning")) { [15:31:51.945] muffled <- grepl(pattern, "muffleWarning") [15:31:51.945] if (muffled) [15:31:51.945] invokeRestart("muffleWarning") [15:31:51.945] } [15:31:51.945] else if (inherits(cond, "condition")) { [15:31:51.945] if (!is.null(pattern)) { [15:31:51.945] computeRestarts <- base::computeRestarts [15:31:51.945] grepl <- base::grepl [15:31:51.945] restarts <- computeRestarts(cond) [15:31:51.945] for (restart in restarts) { [15:31:51.945] name <- restart$name [15:31:51.945] if (is.null(name)) [15:31:51.945] next [15:31:51.945] if (!grepl(pattern, name)) [15:31:51.945] next [15:31:51.945] invokeRestart(restart) [15:31:51.945] muffled <- TRUE [15:31:51.945] break [15:31:51.945] } [15:31:51.945] } [15:31:51.945] } [15:31:51.945] invisible(muffled) [15:31:51.945] } [15:31:51.945] muffleCondition(cond, pattern = "^muffle") [15:31:51.945] } [15:31:51.945] } [15:31:51.945] else { [15:31:51.945] if (TRUE) { [15:31:51.945] muffleCondition <- function (cond, pattern = "^muffle") [15:31:51.945] { [15:31:51.945] inherits <- base::inherits [15:31:51.945] invokeRestart <- base::invokeRestart [15:31:51.945] is.null <- base::is.null [15:31:51.945] muffled <- FALSE [15:31:51.945] if (inherits(cond, "message")) { [15:31:51.945] muffled <- grepl(pattern, "muffleMessage") [15:31:51.945] if (muffled) [15:31:51.945] invokeRestart("muffleMessage") [15:31:51.945] } [15:31:51.945] else if (inherits(cond, "warning")) { [15:31:51.945] muffled <- grepl(pattern, "muffleWarning") [15:31:51.945] if (muffled) [15:31:51.945] invokeRestart("muffleWarning") [15:31:51.945] } [15:31:51.945] else if (inherits(cond, "condition")) { [15:31:51.945] if (!is.null(pattern)) { [15:31:51.945] computeRestarts <- base::computeRestarts [15:31:51.945] grepl <- base::grepl [15:31:51.945] restarts <- computeRestarts(cond) [15:31:51.945] for (restart in restarts) { [15:31:51.945] name <- restart$name [15:31:51.945] if (is.null(name)) [15:31:51.945] next [15:31:51.945] if (!grepl(pattern, name)) [15:31:51.945] next [15:31:51.945] invokeRestart(restart) [15:31:51.945] muffled <- TRUE [15:31:51.945] break [15:31:51.945] } [15:31:51.945] } [15:31:51.945] } [15:31:51.945] invisible(muffled) [15:31:51.945] } [15:31:51.945] muffleCondition(cond, pattern = "^muffle") [15:31:51.945] } [15:31:51.945] } [15:31:51.945] } [15:31:51.945] })) [15:31:51.945] }, error = function(ex) { [15:31:51.945] base::structure(base::list(value = NULL, visible = NULL, [15:31:51.945] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:51.945] ...future.rng), started = ...future.startTime, [15:31:51.945] finished = Sys.time(), session_uuid = NA_character_, [15:31:51.945] version = "1.8"), class = "FutureResult") [15:31:51.945] }, finally = { [15:31:51.945] if (!identical(...future.workdir, getwd())) [15:31:51.945] setwd(...future.workdir) [15:31:51.945] { [15:31:51.945] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:51.945] ...future.oldOptions$nwarnings <- NULL [15:31:51.945] } [15:31:51.945] base::options(...future.oldOptions) [15:31:51.945] if (.Platform$OS.type == "windows") { [15:31:51.945] old_names <- names(...future.oldEnvVars) [15:31:51.945] envs <- base::Sys.getenv() [15:31:51.945] names <- names(envs) [15:31:51.945] common <- intersect(names, old_names) [15:31:51.945] added <- setdiff(names, old_names) [15:31:51.945] removed <- setdiff(old_names, names) [15:31:51.945] changed <- common[...future.oldEnvVars[common] != [15:31:51.945] envs[common]] [15:31:51.945] NAMES <- toupper(changed) [15:31:51.945] args <- list() [15:31:51.945] for (kk in seq_along(NAMES)) { [15:31:51.945] name <- changed[[kk]] [15:31:51.945] NAME <- NAMES[[kk]] [15:31:51.945] if (name != NAME && is.element(NAME, old_names)) [15:31:51.945] next [15:31:51.945] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:51.945] } [15:31:51.945] NAMES <- toupper(added) [15:31:51.945] for (kk in seq_along(NAMES)) { [15:31:51.945] name <- added[[kk]] [15:31:51.945] NAME <- NAMES[[kk]] [15:31:51.945] if (name != NAME && is.element(NAME, old_names)) [15:31:51.945] next [15:31:51.945] args[[name]] <- "" [15:31:51.945] } [15:31:51.945] NAMES <- toupper(removed) [15:31:51.945] for (kk in seq_along(NAMES)) { [15:31:51.945] name <- removed[[kk]] [15:31:51.945] NAME <- NAMES[[kk]] [15:31:51.945] if (name != NAME && is.element(NAME, old_names)) [15:31:51.945] next [15:31:51.945] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:51.945] } [15:31:51.945] if (length(args) > 0) [15:31:51.945] base::do.call(base::Sys.setenv, args = args) [15:31:51.945] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:51.945] } [15:31:51.945] else { [15:31:51.945] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:51.945] } [15:31:51.945] { [15:31:51.945] if (base::length(...future.futureOptionsAdded) > [15:31:51.945] 0L) { [15:31:51.945] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:51.945] base::names(opts) <- ...future.futureOptionsAdded [15:31:51.945] base::options(opts) [15:31:51.945] } [15:31:51.945] { [15:31:51.945] { [15:31:51.945] NULL [15:31:51.945] RNGkind("Mersenne-Twister") [15:31:51.945] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:51.945] inherits = FALSE) [15:31:51.945] } [15:31:51.945] options(future.plan = NULL) [15:31:51.945] if (is.na(NA_character_)) [15:31:51.945] Sys.unsetenv("R_FUTURE_PLAN") [15:31:51.945] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:51.945] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:51.945] .init = FALSE) [15:31:51.945] } [15:31:51.945] } [15:31:51.945] } [15:31:51.945] }) [15:31:51.945] if (TRUE) { [15:31:51.945] base::sink(type = "output", split = FALSE) [15:31:51.945] if (TRUE) { [15:31:51.945] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:51.945] } [15:31:51.945] else { [15:31:51.945] ...future.result["stdout"] <- base::list(NULL) [15:31:51.945] } [15:31:51.945] base::close(...future.stdout) [15:31:51.945] ...future.stdout <- NULL [15:31:51.945] } [15:31:51.945] ...future.result$conditions <- ...future.conditions [15:31:51.945] ...future.result$finished <- base::Sys.time() [15:31:51.945] ...future.result [15:31:51.945] } [15:31:51.950] assign_globals() ... [15:31:51.951] List of 5 [15:31:51.951] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:51.951] $ future.call.arguments :List of 1 [15:31:51.951] ..$ length: int 2 [15:31:51.951] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:51.951] $ ...future.elements_ii :List of 1 [15:31:51.951] ..$ c: chr "character" [15:31:51.951] $ ...future.seeds_ii : NULL [15:31:51.951] $ ...future.globals.maxSize: NULL [15:31:51.951] - attr(*, "where")=List of 5 [15:31:51.951] ..$ ...future.FUN : [15:31:51.951] ..$ future.call.arguments : [15:31:51.951] ..$ ...future.elements_ii : [15:31:51.951] ..$ ...future.seeds_ii : [15:31:51.951] ..$ ...future.globals.maxSize: [15:31:51.951] - attr(*, "resolved")= logi FALSE [15:31:51.951] - attr(*, "total_size")= num 2240 [15:31:51.951] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:51.951] - attr(*, "already-done")= logi TRUE [15:31:51.966] - copied '...future.FUN' to environment [15:31:51.966] - copied 'future.call.arguments' to environment [15:31:51.966] - copied '...future.elements_ii' to environment [15:31:51.966] - copied '...future.seeds_ii' to environment [15:31:51.966] - copied '...future.globals.maxSize' to environment [15:31:51.967] assign_globals() ... done [15:31:51.967] plan(): Setting new future strategy stack: [15:31:51.967] List of future strategies: [15:31:51.967] 1. sequential: [15:31:51.967] - args: function (..., envir = parent.frame(), workers = "") [15:31:51.967] - tweaked: FALSE [15:31:51.967] - call: NULL [15:31:51.968] plan(): nbrOfWorkers() = 1 [15:31:51.970] plan(): Setting new future strategy stack: [15:31:51.971] List of future strategies: [15:31:51.971] 1. sequential: [15:31:51.971] - args: function (..., envir = parent.frame(), workers = "") [15:31:51.971] - tweaked: FALSE [15:31:51.971] - call: plan(strategy) [15:31:51.971] plan(): nbrOfWorkers() = 1 [15:31:51.971] SequentialFuture started (and completed) [15:31:51.972] - Launch lazy future ... done [15:31:51.972] run() for 'SequentialFuture' ... done [15:31:51.972] Created future: [15:31:51.972] SequentialFuture: [15:31:51.972] Label: 'future_lapply-3' [15:31:51.972] Expression: [15:31:51.972] { [15:31:51.972] do.call(function(...) { [15:31:51.972] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.972] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:51.972] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.972] on.exit(options(oopts), add = TRUE) [15:31:51.972] } [15:31:51.972] { [15:31:51.972] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:51.972] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.972] ...future.FUN(...future.X_jj, ...) [15:31:51.972] }) [15:31:51.972] } [15:31:51.972] }, args = future.call.arguments) [15:31:51.972] } [15:31:51.972] Lazy evaluation: FALSE [15:31:51.972] Asynchronous evaluation: FALSE [15:31:51.972] Local evaluation: TRUE [15:31:51.972] Environment: R_GlobalEnv [15:31:51.972] Capture standard output: TRUE [15:31:51.972] Capture condition classes: 'condition' (excluding 'nothing') [15:31:51.972] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 120 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:51.972] Packages: [15:31:51.972] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:51.972] Resolved: TRUE [15:31:51.972] Value: 120 bytes of class 'list' [15:31:51.972] Early signaling: FALSE [15:31:51.972] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:51.972] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:51.974] Chunk #3 of 4 ... DONE [15:31:51.975] Chunk #4 of 4 ... [15:31:51.975] - Finding globals in 'X' for chunk #4 ... [15:31:51.975] getGlobalsAndPackages() ... [15:31:51.975] Searching for globals... [15:31:51.975] [15:31:51.976] Searching for globals ... DONE [15:31:51.976] - globals: [0] [15:31:51.976] getGlobalsAndPackages() ... DONE [15:31:51.976] + additional globals found: [n=0] [15:31:51.976] + additional namespaces needed: [n=0] [15:31:51.977] - Finding globals in 'X' for chunk #4 ... DONE [15:31:51.977] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:51.977] - seeds: [15:31:51.977] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.977] getGlobalsAndPackages() ... [15:31:51.977] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.978] Resolving globals: FALSE [15:31:51.978] Tweak future expression to call with '...' arguments ... [15:31:51.978] { [15:31:51.978] do.call(function(...) { [15:31:51.978] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.978] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:51.978] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.978] on.exit(options(oopts), add = TRUE) [15:31:51.978] } [15:31:51.978] { [15:31:51.978] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:51.978] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.978] ...future.FUN(...future.X_jj, ...) [15:31:51.978] }) [15:31:51.978] } [15:31:51.978] }, args = future.call.arguments) [15:31:51.978] } [15:31:51.979] Tweak future expression to call with '...' arguments ... DONE [15:31:51.979] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:51.979] [15:31:51.979] getGlobalsAndPackages() ... DONE [15:31:51.980] run() for 'Future' ... [15:31:51.980] - state: 'created' [15:31:51.980] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:51.981] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:51.981] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:51.981] - Field: 'label' [15:31:51.981] - Field: 'local' [15:31:51.981] - Field: 'owner' [15:31:51.982] - Field: 'envir' [15:31:51.982] - Field: 'packages' [15:31:51.982] - Field: 'gc' [15:31:51.982] - Field: 'conditions' [15:31:51.982] - Field: 'expr' [15:31:51.983] - Field: 'uuid' [15:31:51.983] - Field: 'seed' [15:31:51.983] - Field: 'version' [15:31:51.983] - Field: 'result' [15:31:51.983] - Field: 'asynchronous' [15:31:51.984] - Field: 'calls' [15:31:51.984] - Field: 'globals' [15:31:51.984] - Field: 'stdout' [15:31:51.984] - Field: 'earlySignal' [15:31:51.984] - Field: 'lazy' [15:31:51.985] - Field: 'state' [15:31:51.985] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:51.985] - Launch lazy future ... [15:31:51.985] Packages needed by the future expression (n = 0): [15:31:51.985] Packages needed by future strategies (n = 0): [15:31:51.986] { [15:31:51.986] { [15:31:51.986] { [15:31:51.986] ...future.startTime <- base::Sys.time() [15:31:51.986] { [15:31:51.986] { [15:31:51.986] { [15:31:51.986] base::local({ [15:31:51.986] has_future <- base::requireNamespace("future", [15:31:51.986] quietly = TRUE) [15:31:51.986] if (has_future) { [15:31:51.986] ns <- base::getNamespace("future") [15:31:51.986] version <- ns[[".package"]][["version"]] [15:31:51.986] if (is.null(version)) [15:31:51.986] version <- utils::packageVersion("future") [15:31:51.986] } [15:31:51.986] else { [15:31:51.986] version <- NULL [15:31:51.986] } [15:31:51.986] if (!has_future || version < "1.8.0") { [15:31:51.986] info <- base::c(r_version = base::gsub("R version ", [15:31:51.986] "", base::R.version$version.string), [15:31:51.986] platform = base::sprintf("%s (%s-bit)", [15:31:51.986] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:51.986] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:51.986] "release", "version")], collapse = " "), [15:31:51.986] hostname = base::Sys.info()[["nodename"]]) [15:31:51.986] info <- base::sprintf("%s: %s", base::names(info), [15:31:51.986] info) [15:31:51.986] info <- base::paste(info, collapse = "; ") [15:31:51.986] if (!has_future) { [15:31:51.986] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:51.986] info) [15:31:51.986] } [15:31:51.986] else { [15:31:51.986] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:51.986] info, version) [15:31:51.986] } [15:31:51.986] base::stop(msg) [15:31:51.986] } [15:31:51.986] }) [15:31:51.986] } [15:31:51.986] ...future.strategy.old <- future::plan("list") [15:31:51.986] options(future.plan = NULL) [15:31:51.986] Sys.unsetenv("R_FUTURE_PLAN") [15:31:51.986] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:51.986] } [15:31:51.986] ...future.workdir <- getwd() [15:31:51.986] } [15:31:51.986] ...future.oldOptions <- base::as.list(base::.Options) [15:31:51.986] ...future.oldEnvVars <- base::Sys.getenv() [15:31:51.986] } [15:31:51.986] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:51.986] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:51.986] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:51.986] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:51.986] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:51.986] future.stdout.windows.reencode = NULL, width = 80L) [15:31:51.986] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:51.986] base::names(...future.oldOptions)) [15:31:51.986] } [15:31:51.986] if (FALSE) { [15:31:51.986] } [15:31:51.986] else { [15:31:51.986] if (TRUE) { [15:31:51.986] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:51.986] open = "w") [15:31:51.986] } [15:31:51.986] else { [15:31:51.986] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:51.986] windows = "NUL", "/dev/null"), open = "w") [15:31:51.986] } [15:31:51.986] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:51.986] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:51.986] base::sink(type = "output", split = FALSE) [15:31:51.986] base::close(...future.stdout) [15:31:51.986] }, add = TRUE) [15:31:51.986] } [15:31:51.986] ...future.frame <- base::sys.nframe() [15:31:51.986] ...future.conditions <- base::list() [15:31:51.986] ...future.rng <- base::globalenv()$.Random.seed [15:31:51.986] if (FALSE) { [15:31:51.986] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:51.986] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:51.986] } [15:31:51.986] ...future.result <- base::tryCatch({ [15:31:51.986] base::withCallingHandlers({ [15:31:51.986] ...future.value <- base::withVisible(base::local({ [15:31:51.986] do.call(function(...) { [15:31:51.986] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:51.986] if (!identical(...future.globals.maxSize.org, [15:31:51.986] ...future.globals.maxSize)) { [15:31:51.986] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:51.986] on.exit(options(oopts), add = TRUE) [15:31:51.986] } [15:31:51.986] { [15:31:51.986] lapply(seq_along(...future.elements_ii), [15:31:51.986] FUN = function(jj) { [15:31:51.986] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:51.986] ...future.FUN(...future.X_jj, ...) [15:31:51.986] }) [15:31:51.986] } [15:31:51.986] }, args = future.call.arguments) [15:31:51.986] })) [15:31:51.986] future::FutureResult(value = ...future.value$value, [15:31:51.986] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:51.986] ...future.rng), globalenv = if (FALSE) [15:31:51.986] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:51.986] ...future.globalenv.names)) [15:31:51.986] else NULL, started = ...future.startTime, version = "1.8") [15:31:51.986] }, condition = base::local({ [15:31:51.986] c <- base::c [15:31:51.986] inherits <- base::inherits [15:31:51.986] invokeRestart <- base::invokeRestart [15:31:51.986] length <- base::length [15:31:51.986] list <- base::list [15:31:51.986] seq.int <- base::seq.int [15:31:51.986] signalCondition <- base::signalCondition [15:31:51.986] sys.calls <- base::sys.calls [15:31:51.986] `[[` <- base::`[[` [15:31:51.986] `+` <- base::`+` [15:31:51.986] `<<-` <- base::`<<-` [15:31:51.986] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:51.986] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:51.986] 3L)] [15:31:51.986] } [15:31:51.986] function(cond) { [15:31:51.986] is_error <- inherits(cond, "error") [15:31:51.986] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:51.986] NULL) [15:31:51.986] if (is_error) { [15:31:51.986] sessionInformation <- function() { [15:31:51.986] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:51.986] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:51.986] search = base::search(), system = base::Sys.info()) [15:31:51.986] } [15:31:51.986] ...future.conditions[[length(...future.conditions) + [15:31:51.986] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:51.986] cond$call), session = sessionInformation(), [15:31:51.986] timestamp = base::Sys.time(), signaled = 0L) [15:31:51.986] signalCondition(cond) [15:31:51.986] } [15:31:51.986] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:51.986] "immediateCondition"))) { [15:31:51.986] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:51.986] ...future.conditions[[length(...future.conditions) + [15:31:51.986] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:51.986] if (TRUE && !signal) { [15:31:51.986] muffleCondition <- function (cond, pattern = "^muffle") [15:31:51.986] { [15:31:51.986] inherits <- base::inherits [15:31:51.986] invokeRestart <- base::invokeRestart [15:31:51.986] is.null <- base::is.null [15:31:51.986] muffled <- FALSE [15:31:51.986] if (inherits(cond, "message")) { [15:31:51.986] muffled <- grepl(pattern, "muffleMessage") [15:31:51.986] if (muffled) [15:31:51.986] invokeRestart("muffleMessage") [15:31:51.986] } [15:31:51.986] else if (inherits(cond, "warning")) { [15:31:51.986] muffled <- grepl(pattern, "muffleWarning") [15:31:51.986] if (muffled) [15:31:51.986] invokeRestart("muffleWarning") [15:31:51.986] } [15:31:51.986] else if (inherits(cond, "condition")) { [15:31:51.986] if (!is.null(pattern)) { [15:31:51.986] computeRestarts <- base::computeRestarts [15:31:51.986] grepl <- base::grepl [15:31:51.986] restarts <- computeRestarts(cond) [15:31:51.986] for (restart in restarts) { [15:31:51.986] name <- restart$name [15:31:51.986] if (is.null(name)) [15:31:51.986] next [15:31:51.986] if (!grepl(pattern, name)) [15:31:51.986] next [15:31:51.986] invokeRestart(restart) [15:31:51.986] muffled <- TRUE [15:31:51.986] break [15:31:51.986] } [15:31:51.986] } [15:31:51.986] } [15:31:51.986] invisible(muffled) [15:31:51.986] } [15:31:51.986] muffleCondition(cond, pattern = "^muffle") [15:31:51.986] } [15:31:51.986] } [15:31:51.986] else { [15:31:51.986] if (TRUE) { [15:31:51.986] muffleCondition <- function (cond, pattern = "^muffle") [15:31:51.986] { [15:31:51.986] inherits <- base::inherits [15:31:51.986] invokeRestart <- base::invokeRestart [15:31:51.986] is.null <- base::is.null [15:31:51.986] muffled <- FALSE [15:31:51.986] if (inherits(cond, "message")) { [15:31:51.986] muffled <- grepl(pattern, "muffleMessage") [15:31:51.986] if (muffled) [15:31:51.986] invokeRestart("muffleMessage") [15:31:51.986] } [15:31:51.986] else if (inherits(cond, "warning")) { [15:31:51.986] muffled <- grepl(pattern, "muffleWarning") [15:31:51.986] if (muffled) [15:31:51.986] invokeRestart("muffleWarning") [15:31:51.986] } [15:31:51.986] else if (inherits(cond, "condition")) { [15:31:51.986] if (!is.null(pattern)) { [15:31:51.986] computeRestarts <- base::computeRestarts [15:31:51.986] grepl <- base::grepl [15:31:51.986] restarts <- computeRestarts(cond) [15:31:51.986] for (restart in restarts) { [15:31:51.986] name <- restart$name [15:31:51.986] if (is.null(name)) [15:31:51.986] next [15:31:51.986] if (!grepl(pattern, name)) [15:31:51.986] next [15:31:51.986] invokeRestart(restart) [15:31:51.986] muffled <- TRUE [15:31:51.986] break [15:31:51.986] } [15:31:51.986] } [15:31:51.986] } [15:31:51.986] invisible(muffled) [15:31:51.986] } [15:31:51.986] muffleCondition(cond, pattern = "^muffle") [15:31:51.986] } [15:31:51.986] } [15:31:51.986] } [15:31:51.986] })) [15:31:51.986] }, error = function(ex) { [15:31:51.986] base::structure(base::list(value = NULL, visible = NULL, [15:31:51.986] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:51.986] ...future.rng), started = ...future.startTime, [15:31:51.986] finished = Sys.time(), session_uuid = NA_character_, [15:31:51.986] version = "1.8"), class = "FutureResult") [15:31:51.986] }, finally = { [15:31:51.986] if (!identical(...future.workdir, getwd())) [15:31:51.986] setwd(...future.workdir) [15:31:51.986] { [15:31:51.986] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:51.986] ...future.oldOptions$nwarnings <- NULL [15:31:51.986] } [15:31:51.986] base::options(...future.oldOptions) [15:31:51.986] if (.Platform$OS.type == "windows") { [15:31:51.986] old_names <- names(...future.oldEnvVars) [15:31:51.986] envs <- base::Sys.getenv() [15:31:51.986] names <- names(envs) [15:31:51.986] common <- intersect(names, old_names) [15:31:51.986] added <- setdiff(names, old_names) [15:31:51.986] removed <- setdiff(old_names, names) [15:31:51.986] changed <- common[...future.oldEnvVars[common] != [15:31:51.986] envs[common]] [15:31:51.986] NAMES <- toupper(changed) [15:31:51.986] args <- list() [15:31:51.986] for (kk in seq_along(NAMES)) { [15:31:51.986] name <- changed[[kk]] [15:31:51.986] NAME <- NAMES[[kk]] [15:31:51.986] if (name != NAME && is.element(NAME, old_names)) [15:31:51.986] next [15:31:51.986] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:51.986] } [15:31:51.986] NAMES <- toupper(added) [15:31:51.986] for (kk in seq_along(NAMES)) { [15:31:51.986] name <- added[[kk]] [15:31:51.986] NAME <- NAMES[[kk]] [15:31:51.986] if (name != NAME && is.element(NAME, old_names)) [15:31:51.986] next [15:31:51.986] args[[name]] <- "" [15:31:51.986] } [15:31:51.986] NAMES <- toupper(removed) [15:31:51.986] for (kk in seq_along(NAMES)) { [15:31:51.986] name <- removed[[kk]] [15:31:51.986] NAME <- NAMES[[kk]] [15:31:51.986] if (name != NAME && is.element(NAME, old_names)) [15:31:51.986] next [15:31:51.986] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:51.986] } [15:31:51.986] if (length(args) > 0) [15:31:51.986] base::do.call(base::Sys.setenv, args = args) [15:31:51.986] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:51.986] } [15:31:51.986] else { [15:31:51.986] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:51.986] } [15:31:51.986] { [15:31:51.986] if (base::length(...future.futureOptionsAdded) > [15:31:51.986] 0L) { [15:31:51.986] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:51.986] base::names(opts) <- ...future.futureOptionsAdded [15:31:51.986] base::options(opts) [15:31:51.986] } [15:31:51.986] { [15:31:51.986] { [15:31:51.986] NULL [15:31:51.986] RNGkind("Mersenne-Twister") [15:31:51.986] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:51.986] inherits = FALSE) [15:31:51.986] } [15:31:51.986] options(future.plan = NULL) [15:31:51.986] if (is.na(NA_character_)) [15:31:51.986] Sys.unsetenv("R_FUTURE_PLAN") [15:31:51.986] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:51.986] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:51.986] .init = FALSE) [15:31:51.986] } [15:31:51.986] } [15:31:51.986] } [15:31:51.986] }) [15:31:51.986] if (TRUE) { [15:31:51.986] base::sink(type = "output", split = FALSE) [15:31:51.986] if (TRUE) { [15:31:51.986] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:51.986] } [15:31:51.986] else { [15:31:51.986] ...future.result["stdout"] <- base::list(NULL) [15:31:51.986] } [15:31:51.986] base::close(...future.stdout) [15:31:51.986] ...future.stdout <- NULL [15:31:51.986] } [15:31:51.986] ...future.result$conditions <- ...future.conditions [15:31:51.986] ...future.result$finished <- base::Sys.time() [15:31:51.986] ...future.result [15:31:51.986] } [15:31:51.990] assign_globals() ... [15:31:51.990] List of 5 [15:31:51.990] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:51.990] $ future.call.arguments :List of 1 [15:31:51.990] ..$ length: int 2 [15:31:51.990] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:51.990] $ ...future.elements_ii :List of 1 [15:31:51.990] ..$ c: chr "list" [15:31:51.990] $ ...future.seeds_ii : NULL [15:31:51.990] $ ...future.globals.maxSize: NULL [15:31:51.990] - attr(*, "where")=List of 5 [15:31:51.990] ..$ ...future.FUN : [15:31:51.990] ..$ future.call.arguments : [15:31:51.990] ..$ ...future.elements_ii : [15:31:51.990] ..$ ...future.seeds_ii : [15:31:51.990] ..$ ...future.globals.maxSize: [15:31:51.990] - attr(*, "resolved")= logi FALSE [15:31:51.990] - attr(*, "total_size")= num 2240 [15:31:51.990] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:51.990] - attr(*, "already-done")= logi TRUE [15:31:51.997] - copied '...future.FUN' to environment [15:31:51.997] - copied 'future.call.arguments' to environment [15:31:51.997] - copied '...future.elements_ii' to environment [15:31:51.997] - copied '...future.seeds_ii' to environment [15:31:51.997] - copied '...future.globals.maxSize' to environment [15:31:51.998] assign_globals() ... done [15:31:51.998] plan(): Setting new future strategy stack: [15:31:51.998] List of future strategies: [15:31:51.998] 1. sequential: [15:31:51.998] - args: function (..., envir = parent.frame(), workers = "") [15:31:51.998] - tweaked: FALSE [15:31:51.998] - call: NULL [15:31:51.999] plan(): nbrOfWorkers() = 1 [15:31:52.001] plan(): Setting new future strategy stack: [15:31:52.001] List of future strategies: [15:31:52.001] 1. sequential: [15:31:52.001] - args: function (..., envir = parent.frame(), workers = "") [15:31:52.001] - tweaked: FALSE [15:31:52.001] - call: plan(strategy) [15:31:52.002] plan(): nbrOfWorkers() = 1 [15:31:52.003] SequentialFuture started (and completed) [15:31:52.003] - Launch lazy future ... done [15:31:52.003] run() for 'SequentialFuture' ... done [15:31:52.004] Created future: [15:31:52.004] SequentialFuture: [15:31:52.004] Label: 'future_lapply-4' [15:31:52.004] Expression: [15:31:52.004] { [15:31:52.004] do.call(function(...) { [15:31:52.004] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.004] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:52.004] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.004] on.exit(options(oopts), add = TRUE) [15:31:52.004] } [15:31:52.004] { [15:31:52.004] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:52.004] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.004] ...future.FUN(...future.X_jj, ...) [15:31:52.004] }) [15:31:52.004] } [15:31:52.004] }, args = future.call.arguments) [15:31:52.004] } [15:31:52.004] Lazy evaluation: FALSE [15:31:52.004] Asynchronous evaluation: FALSE [15:31:52.004] Local evaluation: TRUE [15:31:52.004] Environment: R_GlobalEnv [15:31:52.004] Capture standard output: TRUE [15:31:52.004] Capture condition classes: 'condition' (excluding 'nothing') [15:31:52.004] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:52.004] Packages: [15:31:52.004] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:52.004] Resolved: TRUE [15:31:52.004] Value: 0 bytes of class 'list' [15:31:52.004] Early signaling: FALSE [15:31:52.004] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:52.004] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:52.006] Chunk #4 of 4 ... DONE [15:31:52.006] Launching 4 futures (chunks) ... DONE [15:31:52.006] Resolving 4 futures (chunks) ... [15:31:52.007] resolve() on list ... [15:31:52.007] recursive: 0 [15:31:52.007] length: 4 [15:31:52.008] [15:31:52.008] resolved() for 'SequentialFuture' ... [15:31:52.008] - state: 'finished' [15:31:52.008] - run: TRUE [15:31:52.009] - result: 'FutureResult' [15:31:52.009] resolved() for 'SequentialFuture' ... done [15:31:52.009] Future #1 [15:31:52.010] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:52.010] - nx: 4 [15:31:52.010] - relay: TRUE [15:31:52.011] - stdout: TRUE [15:31:52.011] - signal: TRUE [15:31:52.011] - resignal: FALSE [15:31:52.011] - force: TRUE [15:31:52.012] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [15:31:52.012] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [15:31:52.012] - until=1 [15:31:52.012] - relaying element #1 [15:31:52.013] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:52.013] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:52.013] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:52.014] length: 3 (resolved future 1) [15:31:52.014] resolved() for 'SequentialFuture' ... [15:31:52.014] - state: 'finished' [15:31:52.015] - run: TRUE [15:31:52.015] - result: 'FutureResult' [15:31:52.015] resolved() for 'SequentialFuture' ... done [15:31:52.016] Future #2 [15:31:52.016] signalConditionsASAP(SequentialFuture, pos=2) ... [15:31:52.016] - nx: 4 [15:31:52.017] - relay: TRUE [15:31:52.017] - stdout: TRUE [15:31:52.017] - signal: TRUE [15:31:52.017] - resignal: FALSE [15:31:52.018] - force: TRUE [15:31:52.018] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:52.018] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:52.018] - until=2 [15:31:52.019] - relaying element #2 [15:31:52.019] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:52.019] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:52.020] signalConditionsASAP(SequentialFuture, pos=2) ... done [15:31:52.020] length: 2 (resolved future 2) [15:31:52.020] resolved() for 'SequentialFuture' ... [15:31:52.021] - state: 'finished' [15:31:52.021] - run: TRUE [15:31:52.021] - result: 'FutureResult' [15:31:52.021] resolved() for 'SequentialFuture' ... done [15:31:52.022] Future #3 [15:31:52.022] signalConditionsASAP(SequentialFuture, pos=3) ... [15:31:52.022] - nx: 4 [15:31:52.023] - relay: TRUE [15:31:52.023] - stdout: TRUE [15:31:52.023] - signal: TRUE [15:31:52.023] - resignal: FALSE [15:31:52.024] - force: TRUE [15:31:52.024] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:52.024] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:52.024] - until=3 [15:31:52.025] - relaying element #3 [15:31:52.025] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:52.025] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:52.026] signalConditionsASAP(SequentialFuture, pos=3) ... done [15:31:52.026] length: 1 (resolved future 3) [15:31:52.026] resolved() for 'SequentialFuture' ... [15:31:52.027] - state: 'finished' [15:31:52.027] - run: TRUE [15:31:52.027] - result: 'FutureResult' [15:31:52.027] resolved() for 'SequentialFuture' ... done [15:31:52.028] Future #4 [15:31:52.028] signalConditionsASAP(SequentialFuture, pos=4) ... [15:31:52.028] - nx: 4 [15:31:52.029] - relay: TRUE [15:31:52.029] - stdout: TRUE [15:31:52.029] - signal: TRUE [15:31:52.029] - resignal: FALSE [15:31:52.030] - force: TRUE [15:31:52.030] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:52.030] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:52.030] - until=4 [15:31:52.031] - relaying element #4 [15:31:52.031] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:52.031] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:52.032] signalConditionsASAP(SequentialFuture, pos=4) ... done [15:31:52.032] length: 0 (resolved future 4) [15:31:52.032] Relaying remaining futures [15:31:52.032] signalConditionsASAP(NULL, pos=0) ... [15:31:52.033] - nx: 4 [15:31:52.033] - relay: TRUE [15:31:52.033] - stdout: TRUE [15:31:52.033] - signal: TRUE [15:31:52.034] - resignal: FALSE [15:31:52.034] - force: TRUE [15:31:52.034] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:52.034] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [15:31:52.035] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:52.035] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:52.035] signalConditionsASAP(NULL, pos=0) ... done [15:31:52.036] resolve() on list ... DONE [15:31:52.036] - Number of value chunks collected: 4 [15:31:52.037] Resolving 4 futures (chunks) ... DONE [15:31:52.037] Reducing values from 4 chunks ... [15:31:52.037] - Number of values collected after concatenation: 4 [15:31:52.037] - Number of values expected: 4 [15:31:52.038] Reducing values from 4 chunks ... DONE [15:31:52.038] 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, ...) ... [15:31:52.042] future_lapply() ... [15:31:52.044] Number of chunks: 4 [15:31:52.044] getGlobalsAndPackagesXApply() ... [15:31:52.045] - future.globals: TRUE [15:31:52.045] getGlobalsAndPackages() ... [15:31:52.045] Searching for globals... [15:31:52.047] - globals found: [2] 'FUN', '.Internal' [15:31:52.048] Searching for globals ... DONE [15:31:52.048] Resolving globals: FALSE [15:31:52.049] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:52.050] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:52.050] - globals: [1] 'FUN' [15:31:52.050] [15:31:52.050] getGlobalsAndPackages() ... DONE [15:31:52.051] - globals found/used: [n=1] 'FUN' [15:31:52.051] - needed namespaces: [n=0] [15:31:52.051] Finding globals ... DONE [15:31:52.051] - use_args: TRUE [15:31:52.052] - Getting '...' globals ... [15:31:52.052] resolve() on list ... [15:31:52.053] recursive: 0 [15:31:52.053] length: 1 [15:31:52.053] elements: '...' [15:31:52.054] length: 0 (resolved future 1) [15:31:52.054] resolve() on list ... DONE [15:31:52.054] - '...' content: [n=1] 'length' [15:31:52.054] List of 1 [15:31:52.054] $ ...:List of 1 [15:31:52.054] ..$ length: int 2 [15:31:52.054] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.054] - attr(*, "where")=List of 1 [15:31:52.054] ..$ ...: [15:31:52.054] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.054] - attr(*, "resolved")= logi TRUE [15:31:52.054] - attr(*, "total_size")= num NA [15:31:52.060] - Getting '...' globals ... DONE [15:31:52.061] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:52.061] List of 2 [15:31:52.061] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:52.061] $ ... :List of 1 [15:31:52.061] ..$ length: int 2 [15:31:52.061] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.061] - attr(*, "where")=List of 2 [15:31:52.061] ..$ ...future.FUN: [15:31:52.061] ..$ ... : [15:31:52.061] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.061] - attr(*, "resolved")= logi FALSE [15:31:52.061] - attr(*, "total_size")= num 2240 [15:31:52.067] Packages to be attached in all futures: [n=0] [15:31:52.067] getGlobalsAndPackagesXApply() ... DONE [15:31:52.067] Number of futures (= number of chunks): 4 [15:31:52.068] Launching 4 futures (chunks) ... [15:31:52.068] Chunk #1 of 4 ... [15:31:52.068] - Finding globals in 'X' for chunk #1 ... [15:31:52.069] getGlobalsAndPackages() ... [15:31:52.069] Searching for globals... [15:31:52.069] [15:31:52.070] Searching for globals ... DONE [15:31:52.070] - globals: [0] [15:31:52.070] getGlobalsAndPackages() ... DONE [15:31:52.070] + additional globals found: [n=0] [15:31:52.071] + additional namespaces needed: [n=0] [15:31:52.071] - Finding globals in 'X' for chunk #1 ... DONE [15:31:52.071] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:52.071] - seeds: [15:31:52.072] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.072] getGlobalsAndPackages() ... [15:31:52.072] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.073] Resolving globals: FALSE [15:31:52.073] Tweak future expression to call with '...' arguments ... [15:31:52.073] { [15:31:52.073] do.call(function(...) { [15:31:52.073] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.073] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:52.073] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.073] on.exit(options(oopts), add = TRUE) [15:31:52.073] } [15:31:52.073] { [15:31:52.073] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:52.073] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.073] ...future.FUN(...future.X_jj, ...) [15:31:52.073] }) [15:31:52.073] } [15:31:52.073] }, args = future.call.arguments) [15:31:52.073] } [15:31:52.074] Tweak future expression to call with '...' arguments ... DONE [15:31:52.075] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.075] [15:31:52.075] getGlobalsAndPackages() ... DONE [15:31:52.076] run() for 'Future' ... [15:31:52.076] - state: 'created' [15:31:52.077] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:52.077] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:52.077] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:52.077] - Field: 'label' [15:31:52.078] - Field: 'local' [15:31:52.078] - Field: 'owner' [15:31:52.078] - Field: 'envir' [15:31:52.078] - Field: 'packages' [15:31:52.078] - Field: 'gc' [15:31:52.079] - Field: 'conditions' [15:31:52.079] - Field: 'expr' [15:31:52.079] - Field: 'uuid' [15:31:52.079] - Field: 'seed' [15:31:52.079] - Field: 'version' [15:31:52.079] - Field: 'result' [15:31:52.080] - Field: 'asynchronous' [15:31:52.080] - Field: 'calls' [15:31:52.080] - Field: 'globals' [15:31:52.080] - Field: 'stdout' [15:31:52.080] - Field: 'earlySignal' [15:31:52.081] - Field: 'lazy' [15:31:52.081] - Field: 'state' [15:31:52.081] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:52.082] - Launch lazy future ... [15:31:52.082] Packages needed by the future expression (n = 0): [15:31:52.082] Packages needed by future strategies (n = 0): [15:31:52.083] { [15:31:52.083] { [15:31:52.083] { [15:31:52.083] ...future.startTime <- base::Sys.time() [15:31:52.083] { [15:31:52.083] { [15:31:52.083] { [15:31:52.083] base::local({ [15:31:52.083] has_future <- base::requireNamespace("future", [15:31:52.083] quietly = TRUE) [15:31:52.083] if (has_future) { [15:31:52.083] ns <- base::getNamespace("future") [15:31:52.083] version <- ns[[".package"]][["version"]] [15:31:52.083] if (is.null(version)) [15:31:52.083] version <- utils::packageVersion("future") [15:31:52.083] } [15:31:52.083] else { [15:31:52.083] version <- NULL [15:31:52.083] } [15:31:52.083] if (!has_future || version < "1.8.0") { [15:31:52.083] info <- base::c(r_version = base::gsub("R version ", [15:31:52.083] "", base::R.version$version.string), [15:31:52.083] platform = base::sprintf("%s (%s-bit)", [15:31:52.083] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:52.083] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:52.083] "release", "version")], collapse = " "), [15:31:52.083] hostname = base::Sys.info()[["nodename"]]) [15:31:52.083] info <- base::sprintf("%s: %s", base::names(info), [15:31:52.083] info) [15:31:52.083] info <- base::paste(info, collapse = "; ") [15:31:52.083] if (!has_future) { [15:31:52.083] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:52.083] info) [15:31:52.083] } [15:31:52.083] else { [15:31:52.083] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:52.083] info, version) [15:31:52.083] } [15:31:52.083] base::stop(msg) [15:31:52.083] } [15:31:52.083] }) [15:31:52.083] } [15:31:52.083] ...future.strategy.old <- future::plan("list") [15:31:52.083] options(future.plan = NULL) [15:31:52.083] Sys.unsetenv("R_FUTURE_PLAN") [15:31:52.083] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:52.083] } [15:31:52.083] ...future.workdir <- getwd() [15:31:52.083] } [15:31:52.083] ...future.oldOptions <- base::as.list(base::.Options) [15:31:52.083] ...future.oldEnvVars <- base::Sys.getenv() [15:31:52.083] } [15:31:52.083] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:52.083] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:52.083] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:52.083] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:52.083] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:52.083] future.stdout.windows.reencode = NULL, width = 80L) [15:31:52.083] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:52.083] base::names(...future.oldOptions)) [15:31:52.083] } [15:31:52.083] if (FALSE) { [15:31:52.083] } [15:31:52.083] else { [15:31:52.083] if (TRUE) { [15:31:52.083] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:52.083] open = "w") [15:31:52.083] } [15:31:52.083] else { [15:31:52.083] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:52.083] windows = "NUL", "/dev/null"), open = "w") [15:31:52.083] } [15:31:52.083] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:52.083] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:52.083] base::sink(type = "output", split = FALSE) [15:31:52.083] base::close(...future.stdout) [15:31:52.083] }, add = TRUE) [15:31:52.083] } [15:31:52.083] ...future.frame <- base::sys.nframe() [15:31:52.083] ...future.conditions <- base::list() [15:31:52.083] ...future.rng <- base::globalenv()$.Random.seed [15:31:52.083] if (FALSE) { [15:31:52.083] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:52.083] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:52.083] } [15:31:52.083] ...future.result <- base::tryCatch({ [15:31:52.083] base::withCallingHandlers({ [15:31:52.083] ...future.value <- base::withVisible(base::local({ [15:31:52.083] do.call(function(...) { [15:31:52.083] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.083] if (!identical(...future.globals.maxSize.org, [15:31:52.083] ...future.globals.maxSize)) { [15:31:52.083] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.083] on.exit(options(oopts), add = TRUE) [15:31:52.083] } [15:31:52.083] { [15:31:52.083] lapply(seq_along(...future.elements_ii), [15:31:52.083] FUN = function(jj) { [15:31:52.083] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.083] ...future.FUN(...future.X_jj, ...) [15:31:52.083] }) [15:31:52.083] } [15:31:52.083] }, args = future.call.arguments) [15:31:52.083] })) [15:31:52.083] future::FutureResult(value = ...future.value$value, [15:31:52.083] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:52.083] ...future.rng), globalenv = if (FALSE) [15:31:52.083] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:52.083] ...future.globalenv.names)) [15:31:52.083] else NULL, started = ...future.startTime, version = "1.8") [15:31:52.083] }, condition = base::local({ [15:31:52.083] c <- base::c [15:31:52.083] inherits <- base::inherits [15:31:52.083] invokeRestart <- base::invokeRestart [15:31:52.083] length <- base::length [15:31:52.083] list <- base::list [15:31:52.083] seq.int <- base::seq.int [15:31:52.083] signalCondition <- base::signalCondition [15:31:52.083] sys.calls <- base::sys.calls [15:31:52.083] `[[` <- base::`[[` [15:31:52.083] `+` <- base::`+` [15:31:52.083] `<<-` <- base::`<<-` [15:31:52.083] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:52.083] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:52.083] 3L)] [15:31:52.083] } [15:31:52.083] function(cond) { [15:31:52.083] is_error <- inherits(cond, "error") [15:31:52.083] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:52.083] NULL) [15:31:52.083] if (is_error) { [15:31:52.083] sessionInformation <- function() { [15:31:52.083] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:52.083] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:52.083] search = base::search(), system = base::Sys.info()) [15:31:52.083] } [15:31:52.083] ...future.conditions[[length(...future.conditions) + [15:31:52.083] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:52.083] cond$call), session = sessionInformation(), [15:31:52.083] timestamp = base::Sys.time(), signaled = 0L) [15:31:52.083] signalCondition(cond) [15:31:52.083] } [15:31:52.083] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:52.083] "immediateCondition"))) { [15:31:52.083] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:52.083] ...future.conditions[[length(...future.conditions) + [15:31:52.083] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:52.083] if (TRUE && !signal) { [15:31:52.083] muffleCondition <- function (cond, pattern = "^muffle") [15:31:52.083] { [15:31:52.083] inherits <- base::inherits [15:31:52.083] invokeRestart <- base::invokeRestart [15:31:52.083] is.null <- base::is.null [15:31:52.083] muffled <- FALSE [15:31:52.083] if (inherits(cond, "message")) { [15:31:52.083] muffled <- grepl(pattern, "muffleMessage") [15:31:52.083] if (muffled) [15:31:52.083] invokeRestart("muffleMessage") [15:31:52.083] } [15:31:52.083] else if (inherits(cond, "warning")) { [15:31:52.083] muffled <- grepl(pattern, "muffleWarning") [15:31:52.083] if (muffled) [15:31:52.083] invokeRestart("muffleWarning") [15:31:52.083] } [15:31:52.083] else if (inherits(cond, "condition")) { [15:31:52.083] if (!is.null(pattern)) { [15:31:52.083] computeRestarts <- base::computeRestarts [15:31:52.083] grepl <- base::grepl [15:31:52.083] restarts <- computeRestarts(cond) [15:31:52.083] for (restart in restarts) { [15:31:52.083] name <- restart$name [15:31:52.083] if (is.null(name)) [15:31:52.083] next [15:31:52.083] if (!grepl(pattern, name)) [15:31:52.083] next [15:31:52.083] invokeRestart(restart) [15:31:52.083] muffled <- TRUE [15:31:52.083] break [15:31:52.083] } [15:31:52.083] } [15:31:52.083] } [15:31:52.083] invisible(muffled) [15:31:52.083] } [15:31:52.083] muffleCondition(cond, pattern = "^muffle") [15:31:52.083] } [15:31:52.083] } [15:31:52.083] else { [15:31:52.083] if (TRUE) { [15:31:52.083] muffleCondition <- function (cond, pattern = "^muffle") [15:31:52.083] { [15:31:52.083] inherits <- base::inherits [15:31:52.083] invokeRestart <- base::invokeRestart [15:31:52.083] is.null <- base::is.null [15:31:52.083] muffled <- FALSE [15:31:52.083] if (inherits(cond, "message")) { [15:31:52.083] muffled <- grepl(pattern, "muffleMessage") [15:31:52.083] if (muffled) [15:31:52.083] invokeRestart("muffleMessage") [15:31:52.083] } [15:31:52.083] else if (inherits(cond, "warning")) { [15:31:52.083] muffled <- grepl(pattern, "muffleWarning") [15:31:52.083] if (muffled) [15:31:52.083] invokeRestart("muffleWarning") [15:31:52.083] } [15:31:52.083] else if (inherits(cond, "condition")) { [15:31:52.083] if (!is.null(pattern)) { [15:31:52.083] computeRestarts <- base::computeRestarts [15:31:52.083] grepl <- base::grepl [15:31:52.083] restarts <- computeRestarts(cond) [15:31:52.083] for (restart in restarts) { [15:31:52.083] name <- restart$name [15:31:52.083] if (is.null(name)) [15:31:52.083] next [15:31:52.083] if (!grepl(pattern, name)) [15:31:52.083] next [15:31:52.083] invokeRestart(restart) [15:31:52.083] muffled <- TRUE [15:31:52.083] break [15:31:52.083] } [15:31:52.083] } [15:31:52.083] } [15:31:52.083] invisible(muffled) [15:31:52.083] } [15:31:52.083] muffleCondition(cond, pattern = "^muffle") [15:31:52.083] } [15:31:52.083] } [15:31:52.083] } [15:31:52.083] })) [15:31:52.083] }, error = function(ex) { [15:31:52.083] base::structure(base::list(value = NULL, visible = NULL, [15:31:52.083] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:52.083] ...future.rng), started = ...future.startTime, [15:31:52.083] finished = Sys.time(), session_uuid = NA_character_, [15:31:52.083] version = "1.8"), class = "FutureResult") [15:31:52.083] }, finally = { [15:31:52.083] if (!identical(...future.workdir, getwd())) [15:31:52.083] setwd(...future.workdir) [15:31:52.083] { [15:31:52.083] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:52.083] ...future.oldOptions$nwarnings <- NULL [15:31:52.083] } [15:31:52.083] base::options(...future.oldOptions) [15:31:52.083] if (.Platform$OS.type == "windows") { [15:31:52.083] old_names <- names(...future.oldEnvVars) [15:31:52.083] envs <- base::Sys.getenv() [15:31:52.083] names <- names(envs) [15:31:52.083] common <- intersect(names, old_names) [15:31:52.083] added <- setdiff(names, old_names) [15:31:52.083] removed <- setdiff(old_names, names) [15:31:52.083] changed <- common[...future.oldEnvVars[common] != [15:31:52.083] envs[common]] [15:31:52.083] NAMES <- toupper(changed) [15:31:52.083] args <- list() [15:31:52.083] for (kk in seq_along(NAMES)) { [15:31:52.083] name <- changed[[kk]] [15:31:52.083] NAME <- NAMES[[kk]] [15:31:52.083] if (name != NAME && is.element(NAME, old_names)) [15:31:52.083] next [15:31:52.083] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:52.083] } [15:31:52.083] NAMES <- toupper(added) [15:31:52.083] for (kk in seq_along(NAMES)) { [15:31:52.083] name <- added[[kk]] [15:31:52.083] NAME <- NAMES[[kk]] [15:31:52.083] if (name != NAME && is.element(NAME, old_names)) [15:31:52.083] next [15:31:52.083] args[[name]] <- "" [15:31:52.083] } [15:31:52.083] NAMES <- toupper(removed) [15:31:52.083] for (kk in seq_along(NAMES)) { [15:31:52.083] name <- removed[[kk]] [15:31:52.083] NAME <- NAMES[[kk]] [15:31:52.083] if (name != NAME && is.element(NAME, old_names)) [15:31:52.083] next [15:31:52.083] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:52.083] } [15:31:52.083] if (length(args) > 0) [15:31:52.083] base::do.call(base::Sys.setenv, args = args) [15:31:52.083] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:52.083] } [15:31:52.083] else { [15:31:52.083] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:52.083] } [15:31:52.083] { [15:31:52.083] if (base::length(...future.futureOptionsAdded) > [15:31:52.083] 0L) { [15:31:52.083] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:52.083] base::names(opts) <- ...future.futureOptionsAdded [15:31:52.083] base::options(opts) [15:31:52.083] } [15:31:52.083] { [15:31:52.083] { [15:31:52.083] NULL [15:31:52.083] RNGkind("Mersenne-Twister") [15:31:52.083] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:52.083] inherits = FALSE) [15:31:52.083] } [15:31:52.083] options(future.plan = NULL) [15:31:52.083] if (is.na(NA_character_)) [15:31:52.083] Sys.unsetenv("R_FUTURE_PLAN") [15:31:52.083] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:52.083] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:52.083] .init = FALSE) [15:31:52.083] } [15:31:52.083] } [15:31:52.083] } [15:31:52.083] }) [15:31:52.083] if (TRUE) { [15:31:52.083] base::sink(type = "output", split = FALSE) [15:31:52.083] if (TRUE) { [15:31:52.083] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:52.083] } [15:31:52.083] else { [15:31:52.083] ...future.result["stdout"] <- base::list(NULL) [15:31:52.083] } [15:31:52.083] base::close(...future.stdout) [15:31:52.083] ...future.stdout <- NULL [15:31:52.083] } [15:31:52.083] ...future.result$conditions <- ...future.conditions [15:31:52.083] ...future.result$finished <- base::Sys.time() [15:31:52.083] ...future.result [15:31:52.083] } [15:31:52.087] assign_globals() ... [15:31:52.087] List of 5 [15:31:52.087] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:52.087] $ future.call.arguments :List of 1 [15:31:52.087] ..$ length: int 2 [15:31:52.087] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.087] $ ...future.elements_ii :List of 1 [15:31:52.087] ..$ a: chr "integer" [15:31:52.087] $ ...future.seeds_ii : NULL [15:31:52.087] $ ...future.globals.maxSize: NULL [15:31:52.087] - attr(*, "where")=List of 5 [15:31:52.087] ..$ ...future.FUN : [15:31:52.087] ..$ future.call.arguments : [15:31:52.087] ..$ ...future.elements_ii : [15:31:52.087] ..$ ...future.seeds_ii : [15:31:52.087] ..$ ...future.globals.maxSize: [15:31:52.087] - attr(*, "resolved")= logi FALSE [15:31:52.087] - attr(*, "total_size")= num 2240 [15:31:52.087] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.087] - attr(*, "already-done")= logi TRUE [15:31:52.094] - copied '...future.FUN' to environment [15:31:52.094] - copied 'future.call.arguments' to environment [15:31:52.095] - copied '...future.elements_ii' to environment [15:31:52.095] - copied '...future.seeds_ii' to environment [15:31:52.095] - copied '...future.globals.maxSize' to environment [15:31:52.095] assign_globals() ... done [15:31:52.096] plan(): Setting new future strategy stack: [15:31:52.096] List of future strategies: [15:31:52.096] 1. sequential: [15:31:52.096] - args: function (..., envir = parent.frame(), workers = "") [15:31:52.096] - tweaked: FALSE [15:31:52.096] - call: NULL [15:31:52.097] plan(): nbrOfWorkers() = 1 [15:31:52.099] plan(): Setting new future strategy stack: [15:31:52.099] List of future strategies: [15:31:52.099] 1. sequential: [15:31:52.099] - args: function (..., envir = parent.frame(), workers = "") [15:31:52.099] - tweaked: FALSE [15:31:52.099] - call: plan(strategy) [15:31:52.100] plan(): nbrOfWorkers() = 1 [15:31:52.100] SequentialFuture started (and completed) [15:31:52.101] - Launch lazy future ... done [15:31:52.101] run() for 'SequentialFuture' ... done [15:31:52.101] Created future: [15:31:52.101] SequentialFuture: [15:31:52.101] Label: 'future_lapply-1' [15:31:52.101] Expression: [15:31:52.101] { [15:31:52.101] do.call(function(...) { [15:31:52.101] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.101] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:52.101] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.101] on.exit(options(oopts), add = TRUE) [15:31:52.101] } [15:31:52.101] { [15:31:52.101] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:52.101] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.101] ...future.FUN(...future.X_jj, ...) [15:31:52.101] }) [15:31:52.101] } [15:31:52.101] }, args = future.call.arguments) [15:31:52.101] } [15:31:52.101] Lazy evaluation: FALSE [15:31:52.101] Asynchronous evaluation: FALSE [15:31:52.101] Local evaluation: TRUE [15:31:52.101] Environment: R_GlobalEnv [15:31:52.101] Capture standard output: TRUE [15:31:52.101] Capture condition classes: 'condition' (excluding 'nothing') [15:31:52.101] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:52.101] Packages: [15:31:52.101] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:52.101] Resolved: TRUE [15:31:52.101] Value: 56 bytes of class 'list' [15:31:52.101] Early signaling: FALSE [15:31:52.101] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:52.101] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:52.103] Chunk #1 of 4 ... DONE [15:31:52.103] Chunk #2 of 4 ... [15:31:52.103] - Finding globals in 'X' for chunk #2 ... [15:31:52.104] getGlobalsAndPackages() ... [15:31:52.104] Searching for globals... [15:31:52.104] [15:31:52.105] Searching for globals ... DONE [15:31:52.105] - globals: [0] [15:31:52.105] getGlobalsAndPackages() ... DONE [15:31:52.105] + additional globals found: [n=0] [15:31:52.106] + additional namespaces needed: [n=0] [15:31:52.106] - Finding globals in 'X' for chunk #2 ... DONE [15:31:52.106] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:52.106] - seeds: [15:31:52.107] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.107] getGlobalsAndPackages() ... [15:31:52.107] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.107] Resolving globals: FALSE [15:31:52.107] Tweak future expression to call with '...' arguments ... [15:31:52.108] { [15:31:52.108] do.call(function(...) { [15:31:52.108] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.108] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:52.108] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.108] on.exit(options(oopts), add = TRUE) [15:31:52.108] } [15:31:52.108] { [15:31:52.108] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:52.108] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.108] ...future.FUN(...future.X_jj, ...) [15:31:52.108] }) [15:31:52.108] } [15:31:52.108] }, args = future.call.arguments) [15:31:52.108] } [15:31:52.108] Tweak future expression to call with '...' arguments ... DONE [15:31:52.109] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.111] [15:31:52.112] getGlobalsAndPackages() ... DONE [15:31:52.112] run() for 'Future' ... [15:31:52.112] - state: 'created' [15:31:52.113] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:52.113] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:52.113] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:52.114] - Field: 'label' [15:31:52.114] - Field: 'local' [15:31:52.114] - Field: 'owner' [15:31:52.114] - Field: 'envir' [15:31:52.114] - Field: 'packages' [15:31:52.114] - Field: 'gc' [15:31:52.115] - Field: 'conditions' [15:31:52.115] - Field: 'expr' [15:31:52.115] - Field: 'uuid' [15:31:52.115] - Field: 'seed' [15:31:52.115] - Field: 'version' [15:31:52.116] - Field: 'result' [15:31:52.116] - Field: 'asynchronous' [15:31:52.116] - Field: 'calls' [15:31:52.116] - Field: 'globals' [15:31:52.116] - Field: 'stdout' [15:31:52.116] - Field: 'earlySignal' [15:31:52.117] - Field: 'lazy' [15:31:52.117] - Field: 'state' [15:31:52.117] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:52.117] - Launch lazy future ... [15:31:52.117] Packages needed by the future expression (n = 0): [15:31:52.118] Packages needed by future strategies (n = 0): [15:31:52.118] { [15:31:52.118] { [15:31:52.118] { [15:31:52.118] ...future.startTime <- base::Sys.time() [15:31:52.118] { [15:31:52.118] { [15:31:52.118] { [15:31:52.118] base::local({ [15:31:52.118] has_future <- base::requireNamespace("future", [15:31:52.118] quietly = TRUE) [15:31:52.118] if (has_future) { [15:31:52.118] ns <- base::getNamespace("future") [15:31:52.118] version <- ns[[".package"]][["version"]] [15:31:52.118] if (is.null(version)) [15:31:52.118] version <- utils::packageVersion("future") [15:31:52.118] } [15:31:52.118] else { [15:31:52.118] version <- NULL [15:31:52.118] } [15:31:52.118] if (!has_future || version < "1.8.0") { [15:31:52.118] info <- base::c(r_version = base::gsub("R version ", [15:31:52.118] "", base::R.version$version.string), [15:31:52.118] platform = base::sprintf("%s (%s-bit)", [15:31:52.118] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:52.118] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:52.118] "release", "version")], collapse = " "), [15:31:52.118] hostname = base::Sys.info()[["nodename"]]) [15:31:52.118] info <- base::sprintf("%s: %s", base::names(info), [15:31:52.118] info) [15:31:52.118] info <- base::paste(info, collapse = "; ") [15:31:52.118] if (!has_future) { [15:31:52.118] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:52.118] info) [15:31:52.118] } [15:31:52.118] else { [15:31:52.118] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:52.118] info, version) [15:31:52.118] } [15:31:52.118] base::stop(msg) [15:31:52.118] } [15:31:52.118] }) [15:31:52.118] } [15:31:52.118] ...future.strategy.old <- future::plan("list") [15:31:52.118] options(future.plan = NULL) [15:31:52.118] Sys.unsetenv("R_FUTURE_PLAN") [15:31:52.118] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:52.118] } [15:31:52.118] ...future.workdir <- getwd() [15:31:52.118] } [15:31:52.118] ...future.oldOptions <- base::as.list(base::.Options) [15:31:52.118] ...future.oldEnvVars <- base::Sys.getenv() [15:31:52.118] } [15:31:52.118] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:52.118] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:52.118] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:52.118] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:52.118] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:52.118] future.stdout.windows.reencode = NULL, width = 80L) [15:31:52.118] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:52.118] base::names(...future.oldOptions)) [15:31:52.118] } [15:31:52.118] if (FALSE) { [15:31:52.118] } [15:31:52.118] else { [15:31:52.118] if (TRUE) { [15:31:52.118] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:52.118] open = "w") [15:31:52.118] } [15:31:52.118] else { [15:31:52.118] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:52.118] windows = "NUL", "/dev/null"), open = "w") [15:31:52.118] } [15:31:52.118] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:52.118] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:52.118] base::sink(type = "output", split = FALSE) [15:31:52.118] base::close(...future.stdout) [15:31:52.118] }, add = TRUE) [15:31:52.118] } [15:31:52.118] ...future.frame <- base::sys.nframe() [15:31:52.118] ...future.conditions <- base::list() [15:31:52.118] ...future.rng <- base::globalenv()$.Random.seed [15:31:52.118] if (FALSE) { [15:31:52.118] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:52.118] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:52.118] } [15:31:52.118] ...future.result <- base::tryCatch({ [15:31:52.118] base::withCallingHandlers({ [15:31:52.118] ...future.value <- base::withVisible(base::local({ [15:31:52.118] do.call(function(...) { [15:31:52.118] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.118] if (!identical(...future.globals.maxSize.org, [15:31:52.118] ...future.globals.maxSize)) { [15:31:52.118] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.118] on.exit(options(oopts), add = TRUE) [15:31:52.118] } [15:31:52.118] { [15:31:52.118] lapply(seq_along(...future.elements_ii), [15:31:52.118] FUN = function(jj) { [15:31:52.118] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.118] ...future.FUN(...future.X_jj, ...) [15:31:52.118] }) [15:31:52.118] } [15:31:52.118] }, args = future.call.arguments) [15:31:52.118] })) [15:31:52.118] future::FutureResult(value = ...future.value$value, [15:31:52.118] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:52.118] ...future.rng), globalenv = if (FALSE) [15:31:52.118] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:52.118] ...future.globalenv.names)) [15:31:52.118] else NULL, started = ...future.startTime, version = "1.8") [15:31:52.118] }, condition = base::local({ [15:31:52.118] c <- base::c [15:31:52.118] inherits <- base::inherits [15:31:52.118] invokeRestart <- base::invokeRestart [15:31:52.118] length <- base::length [15:31:52.118] list <- base::list [15:31:52.118] seq.int <- base::seq.int [15:31:52.118] signalCondition <- base::signalCondition [15:31:52.118] sys.calls <- base::sys.calls [15:31:52.118] `[[` <- base::`[[` [15:31:52.118] `+` <- base::`+` [15:31:52.118] `<<-` <- base::`<<-` [15:31:52.118] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:52.118] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:52.118] 3L)] [15:31:52.118] } [15:31:52.118] function(cond) { [15:31:52.118] is_error <- inherits(cond, "error") [15:31:52.118] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:52.118] NULL) [15:31:52.118] if (is_error) { [15:31:52.118] sessionInformation <- function() { [15:31:52.118] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:52.118] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:52.118] search = base::search(), system = base::Sys.info()) [15:31:52.118] } [15:31:52.118] ...future.conditions[[length(...future.conditions) + [15:31:52.118] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:52.118] cond$call), session = sessionInformation(), [15:31:52.118] timestamp = base::Sys.time(), signaled = 0L) [15:31:52.118] signalCondition(cond) [15:31:52.118] } [15:31:52.118] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:52.118] "immediateCondition"))) { [15:31:52.118] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:52.118] ...future.conditions[[length(...future.conditions) + [15:31:52.118] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:52.118] if (TRUE && !signal) { [15:31:52.118] muffleCondition <- function (cond, pattern = "^muffle") [15:31:52.118] { [15:31:52.118] inherits <- base::inherits [15:31:52.118] invokeRestart <- base::invokeRestart [15:31:52.118] is.null <- base::is.null [15:31:52.118] muffled <- FALSE [15:31:52.118] if (inherits(cond, "message")) { [15:31:52.118] muffled <- grepl(pattern, "muffleMessage") [15:31:52.118] if (muffled) [15:31:52.118] invokeRestart("muffleMessage") [15:31:52.118] } [15:31:52.118] else if (inherits(cond, "warning")) { [15:31:52.118] muffled <- grepl(pattern, "muffleWarning") [15:31:52.118] if (muffled) [15:31:52.118] invokeRestart("muffleWarning") [15:31:52.118] } [15:31:52.118] else if (inherits(cond, "condition")) { [15:31:52.118] if (!is.null(pattern)) { [15:31:52.118] computeRestarts <- base::computeRestarts [15:31:52.118] grepl <- base::grepl [15:31:52.118] restarts <- computeRestarts(cond) [15:31:52.118] for (restart in restarts) { [15:31:52.118] name <- restart$name [15:31:52.118] if (is.null(name)) [15:31:52.118] next [15:31:52.118] if (!grepl(pattern, name)) [15:31:52.118] next [15:31:52.118] invokeRestart(restart) [15:31:52.118] muffled <- TRUE [15:31:52.118] break [15:31:52.118] } [15:31:52.118] } [15:31:52.118] } [15:31:52.118] invisible(muffled) [15:31:52.118] } [15:31:52.118] muffleCondition(cond, pattern = "^muffle") [15:31:52.118] } [15:31:52.118] } [15:31:52.118] else { [15:31:52.118] if (TRUE) { [15:31:52.118] muffleCondition <- function (cond, pattern = "^muffle") [15:31:52.118] { [15:31:52.118] inherits <- base::inherits [15:31:52.118] invokeRestart <- base::invokeRestart [15:31:52.118] is.null <- base::is.null [15:31:52.118] muffled <- FALSE [15:31:52.118] if (inherits(cond, "message")) { [15:31:52.118] muffled <- grepl(pattern, "muffleMessage") [15:31:52.118] if (muffled) [15:31:52.118] invokeRestart("muffleMessage") [15:31:52.118] } [15:31:52.118] else if (inherits(cond, "warning")) { [15:31:52.118] muffled <- grepl(pattern, "muffleWarning") [15:31:52.118] if (muffled) [15:31:52.118] invokeRestart("muffleWarning") [15:31:52.118] } [15:31:52.118] else if (inherits(cond, "condition")) { [15:31:52.118] if (!is.null(pattern)) { [15:31:52.118] computeRestarts <- base::computeRestarts [15:31:52.118] grepl <- base::grepl [15:31:52.118] restarts <- computeRestarts(cond) [15:31:52.118] for (restart in restarts) { [15:31:52.118] name <- restart$name [15:31:52.118] if (is.null(name)) [15:31:52.118] next [15:31:52.118] if (!grepl(pattern, name)) [15:31:52.118] next [15:31:52.118] invokeRestart(restart) [15:31:52.118] muffled <- TRUE [15:31:52.118] break [15:31:52.118] } [15:31:52.118] } [15:31:52.118] } [15:31:52.118] invisible(muffled) [15:31:52.118] } [15:31:52.118] muffleCondition(cond, pattern = "^muffle") [15:31:52.118] } [15:31:52.118] } [15:31:52.118] } [15:31:52.118] })) [15:31:52.118] }, error = function(ex) { [15:31:52.118] base::structure(base::list(value = NULL, visible = NULL, [15:31:52.118] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:52.118] ...future.rng), started = ...future.startTime, [15:31:52.118] finished = Sys.time(), session_uuid = NA_character_, [15:31:52.118] version = "1.8"), class = "FutureResult") [15:31:52.118] }, finally = { [15:31:52.118] if (!identical(...future.workdir, getwd())) [15:31:52.118] setwd(...future.workdir) [15:31:52.118] { [15:31:52.118] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:52.118] ...future.oldOptions$nwarnings <- NULL [15:31:52.118] } [15:31:52.118] base::options(...future.oldOptions) [15:31:52.118] if (.Platform$OS.type == "windows") { [15:31:52.118] old_names <- names(...future.oldEnvVars) [15:31:52.118] envs <- base::Sys.getenv() [15:31:52.118] names <- names(envs) [15:31:52.118] common <- intersect(names, old_names) [15:31:52.118] added <- setdiff(names, old_names) [15:31:52.118] removed <- setdiff(old_names, names) [15:31:52.118] changed <- common[...future.oldEnvVars[common] != [15:31:52.118] envs[common]] [15:31:52.118] NAMES <- toupper(changed) [15:31:52.118] args <- list() [15:31:52.118] for (kk in seq_along(NAMES)) { [15:31:52.118] name <- changed[[kk]] [15:31:52.118] NAME <- NAMES[[kk]] [15:31:52.118] if (name != NAME && is.element(NAME, old_names)) [15:31:52.118] next [15:31:52.118] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:52.118] } [15:31:52.118] NAMES <- toupper(added) [15:31:52.118] for (kk in seq_along(NAMES)) { [15:31:52.118] name <- added[[kk]] [15:31:52.118] NAME <- NAMES[[kk]] [15:31:52.118] if (name != NAME && is.element(NAME, old_names)) [15:31:52.118] next [15:31:52.118] args[[name]] <- "" [15:31:52.118] } [15:31:52.118] NAMES <- toupper(removed) [15:31:52.118] for (kk in seq_along(NAMES)) { [15:31:52.118] name <- removed[[kk]] [15:31:52.118] NAME <- NAMES[[kk]] [15:31:52.118] if (name != NAME && is.element(NAME, old_names)) [15:31:52.118] next [15:31:52.118] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:52.118] } [15:31:52.118] if (length(args) > 0) [15:31:52.118] base::do.call(base::Sys.setenv, args = args) [15:31:52.118] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:52.118] } [15:31:52.118] else { [15:31:52.118] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:52.118] } [15:31:52.118] { [15:31:52.118] if (base::length(...future.futureOptionsAdded) > [15:31:52.118] 0L) { [15:31:52.118] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:52.118] base::names(opts) <- ...future.futureOptionsAdded [15:31:52.118] base::options(opts) [15:31:52.118] } [15:31:52.118] { [15:31:52.118] { [15:31:52.118] NULL [15:31:52.118] RNGkind("Mersenne-Twister") [15:31:52.118] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:52.118] inherits = FALSE) [15:31:52.118] } [15:31:52.118] options(future.plan = NULL) [15:31:52.118] if (is.na(NA_character_)) [15:31:52.118] Sys.unsetenv("R_FUTURE_PLAN") [15:31:52.118] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:52.118] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:52.118] .init = FALSE) [15:31:52.118] } [15:31:52.118] } [15:31:52.118] } [15:31:52.118] }) [15:31:52.118] if (TRUE) { [15:31:52.118] base::sink(type = "output", split = FALSE) [15:31:52.118] if (TRUE) { [15:31:52.118] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:52.118] } [15:31:52.118] else { [15:31:52.118] ...future.result["stdout"] <- base::list(NULL) [15:31:52.118] } [15:31:52.118] base::close(...future.stdout) [15:31:52.118] ...future.stdout <- NULL [15:31:52.118] } [15:31:52.118] ...future.result$conditions <- ...future.conditions [15:31:52.118] ...future.result$finished <- base::Sys.time() [15:31:52.118] ...future.result [15:31:52.118] } [15:31:52.123] assign_globals() ... [15:31:52.123] List of 5 [15:31:52.123] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:52.123] $ future.call.arguments :List of 1 [15:31:52.123] ..$ length: int 2 [15:31:52.123] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.123] $ ...future.elements_ii :List of 1 [15:31:52.123] ..$ b: chr "numeric" [15:31:52.123] $ ...future.seeds_ii : NULL [15:31:52.123] $ ...future.globals.maxSize: NULL [15:31:52.123] - attr(*, "where")=List of 5 [15:31:52.123] ..$ ...future.FUN : [15:31:52.123] ..$ future.call.arguments : [15:31:52.123] ..$ ...future.elements_ii : [15:31:52.123] ..$ ...future.seeds_ii : [15:31:52.123] ..$ ...future.globals.maxSize: [15:31:52.123] - attr(*, "resolved")= logi FALSE [15:31:52.123] - attr(*, "total_size")= num 2240 [15:31:52.123] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.123] - attr(*, "already-done")= logi TRUE [15:31:52.132] - copied '...future.FUN' to environment [15:31:52.132] - copied 'future.call.arguments' to environment [15:31:52.133] - copied '...future.elements_ii' to environment [15:31:52.133] - copied '...future.seeds_ii' to environment [15:31:52.133] - copied '...future.globals.maxSize' to environment [15:31:52.133] assign_globals() ... done [15:31:52.134] plan(): Setting new future strategy stack: [15:31:52.134] List of future strategies: [15:31:52.134] 1. sequential: [15:31:52.134] - args: function (..., envir = parent.frame(), workers = "") [15:31:52.134] - tweaked: FALSE [15:31:52.134] - call: NULL [15:31:52.135] plan(): nbrOfWorkers() = 1 [15:31:52.137] plan(): Setting new future strategy stack: [15:31:52.138] List of future strategies: [15:31:52.138] 1. sequential: [15:31:52.138] - args: function (..., envir = parent.frame(), workers = "") [15:31:52.138] - tweaked: FALSE [15:31:52.138] - call: plan(strategy) [15:31:52.139] plan(): nbrOfWorkers() = 1 [15:31:52.139] SequentialFuture started (and completed) [15:31:52.139] - Launch lazy future ... done [15:31:52.139] run() for 'SequentialFuture' ... done [15:31:52.140] Created future: [15:31:52.140] SequentialFuture: [15:31:52.140] Label: 'future_lapply-2' [15:31:52.140] Expression: [15:31:52.140] { [15:31:52.140] do.call(function(...) { [15:31:52.140] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.140] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:52.140] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.140] on.exit(options(oopts), add = TRUE) [15:31:52.140] } [15:31:52.140] { [15:31:52.140] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:52.140] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.140] ...future.FUN(...future.X_jj, ...) [15:31:52.140] }) [15:31:52.140] } [15:31:52.140] }, args = future.call.arguments) [15:31:52.140] } [15:31:52.140] Lazy evaluation: FALSE [15:31:52.140] Asynchronous evaluation: FALSE [15:31:52.140] Local evaluation: TRUE [15:31:52.140] Environment: R_GlobalEnv [15:31:52.140] Capture standard output: TRUE [15:31:52.140] Capture condition classes: 'condition' (excluding 'nothing') [15:31:52.140] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:52.140] Packages: [15:31:52.140] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:52.140] Resolved: TRUE [15:31:52.140] Value: 64 bytes of class 'list' [15:31:52.140] Early signaling: FALSE [15:31:52.140] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:52.140] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:52.142] Chunk #2 of 4 ... DONE [15:31:52.142] Chunk #3 of 4 ... [15:31:52.143] - Finding globals in 'X' for chunk #3 ... [15:31:52.143] getGlobalsAndPackages() ... [15:31:52.143] Searching for globals... [15:31:52.144] [15:31:52.144] Searching for globals ... DONE [15:31:52.144] - globals: [0] [15:31:52.144] getGlobalsAndPackages() ... DONE [15:31:52.144] + additional globals found: [n=0] [15:31:52.145] + additional namespaces needed: [n=0] [15:31:52.145] - Finding globals in 'X' for chunk #3 ... DONE [15:31:52.145] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:52.145] - seeds: [15:31:52.145] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.146] getGlobalsAndPackages() ... [15:31:52.146] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.146] Resolving globals: FALSE [15:31:52.146] Tweak future expression to call with '...' arguments ... [15:31:52.146] { [15:31:52.146] do.call(function(...) { [15:31:52.146] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.146] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:52.146] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.146] on.exit(options(oopts), add = TRUE) [15:31:52.146] } [15:31:52.146] { [15:31:52.146] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:52.146] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.146] ...future.FUN(...future.X_jj, ...) [15:31:52.146] }) [15:31:52.146] } [15:31:52.146] }, args = future.call.arguments) [15:31:52.146] } [15:31:52.147] Tweak future expression to call with '...' arguments ... DONE [15:31:52.147] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.148] [15:31:52.148] getGlobalsAndPackages() ... DONE [15:31:52.148] run() for 'Future' ... [15:31:52.148] - state: 'created' [15:31:52.149] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:52.149] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:52.150] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:52.150] - Field: 'label' [15:31:52.150] - Field: 'local' [15:31:52.150] - Field: 'owner' [15:31:52.150] - Field: 'envir' [15:31:52.150] - Field: 'packages' [15:31:52.151] - Field: 'gc' [15:31:52.151] - Field: 'conditions' [15:31:52.151] - Field: 'expr' [15:31:52.151] - Field: 'uuid' [15:31:52.151] - Field: 'seed' [15:31:52.152] - Field: 'version' [15:31:52.152] - Field: 'result' [15:31:52.152] - Field: 'asynchronous' [15:31:52.152] - Field: 'calls' [15:31:52.153] - Field: 'globals' [15:31:52.153] - Field: 'stdout' [15:31:52.153] - Field: 'earlySignal' [15:31:52.154] - Field: 'lazy' [15:31:52.154] - Field: 'state' [15:31:52.154] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:52.155] - Launch lazy future ... [15:31:52.155] Packages needed by the future expression (n = 0): [15:31:52.155] Packages needed by future strategies (n = 0): [15:31:52.156] { [15:31:52.156] { [15:31:52.156] { [15:31:52.156] ...future.startTime <- base::Sys.time() [15:31:52.156] { [15:31:52.156] { [15:31:52.156] { [15:31:52.156] base::local({ [15:31:52.156] has_future <- base::requireNamespace("future", [15:31:52.156] quietly = TRUE) [15:31:52.156] if (has_future) { [15:31:52.156] ns <- base::getNamespace("future") [15:31:52.156] version <- ns[[".package"]][["version"]] [15:31:52.156] if (is.null(version)) [15:31:52.156] version <- utils::packageVersion("future") [15:31:52.156] } [15:31:52.156] else { [15:31:52.156] version <- NULL [15:31:52.156] } [15:31:52.156] if (!has_future || version < "1.8.0") { [15:31:52.156] info <- base::c(r_version = base::gsub("R version ", [15:31:52.156] "", base::R.version$version.string), [15:31:52.156] platform = base::sprintf("%s (%s-bit)", [15:31:52.156] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:52.156] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:52.156] "release", "version")], collapse = " "), [15:31:52.156] hostname = base::Sys.info()[["nodename"]]) [15:31:52.156] info <- base::sprintf("%s: %s", base::names(info), [15:31:52.156] info) [15:31:52.156] info <- base::paste(info, collapse = "; ") [15:31:52.156] if (!has_future) { [15:31:52.156] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:52.156] info) [15:31:52.156] } [15:31:52.156] else { [15:31:52.156] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:52.156] info, version) [15:31:52.156] } [15:31:52.156] base::stop(msg) [15:31:52.156] } [15:31:52.156] }) [15:31:52.156] } [15:31:52.156] ...future.strategy.old <- future::plan("list") [15:31:52.156] options(future.plan = NULL) [15:31:52.156] Sys.unsetenv("R_FUTURE_PLAN") [15:31:52.156] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:52.156] } [15:31:52.156] ...future.workdir <- getwd() [15:31:52.156] } [15:31:52.156] ...future.oldOptions <- base::as.list(base::.Options) [15:31:52.156] ...future.oldEnvVars <- base::Sys.getenv() [15:31:52.156] } [15:31:52.156] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:52.156] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:52.156] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:52.156] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:52.156] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:52.156] future.stdout.windows.reencode = NULL, width = 80L) [15:31:52.156] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:52.156] base::names(...future.oldOptions)) [15:31:52.156] } [15:31:52.156] if (FALSE) { [15:31:52.156] } [15:31:52.156] else { [15:31:52.156] if (TRUE) { [15:31:52.156] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:52.156] open = "w") [15:31:52.156] } [15:31:52.156] else { [15:31:52.156] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:52.156] windows = "NUL", "/dev/null"), open = "w") [15:31:52.156] } [15:31:52.156] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:52.156] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:52.156] base::sink(type = "output", split = FALSE) [15:31:52.156] base::close(...future.stdout) [15:31:52.156] }, add = TRUE) [15:31:52.156] } [15:31:52.156] ...future.frame <- base::sys.nframe() [15:31:52.156] ...future.conditions <- base::list() [15:31:52.156] ...future.rng <- base::globalenv()$.Random.seed [15:31:52.156] if (FALSE) { [15:31:52.156] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:52.156] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:52.156] } [15:31:52.156] ...future.result <- base::tryCatch({ [15:31:52.156] base::withCallingHandlers({ [15:31:52.156] ...future.value <- base::withVisible(base::local({ [15:31:52.156] do.call(function(...) { [15:31:52.156] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.156] if (!identical(...future.globals.maxSize.org, [15:31:52.156] ...future.globals.maxSize)) { [15:31:52.156] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.156] on.exit(options(oopts), add = TRUE) [15:31:52.156] } [15:31:52.156] { [15:31:52.156] lapply(seq_along(...future.elements_ii), [15:31:52.156] FUN = function(jj) { [15:31:52.156] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.156] ...future.FUN(...future.X_jj, ...) [15:31:52.156] }) [15:31:52.156] } [15:31:52.156] }, args = future.call.arguments) [15:31:52.156] })) [15:31:52.156] future::FutureResult(value = ...future.value$value, [15:31:52.156] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:52.156] ...future.rng), globalenv = if (FALSE) [15:31:52.156] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:52.156] ...future.globalenv.names)) [15:31:52.156] else NULL, started = ...future.startTime, version = "1.8") [15:31:52.156] }, condition = base::local({ [15:31:52.156] c <- base::c [15:31:52.156] inherits <- base::inherits [15:31:52.156] invokeRestart <- base::invokeRestart [15:31:52.156] length <- base::length [15:31:52.156] list <- base::list [15:31:52.156] seq.int <- base::seq.int [15:31:52.156] signalCondition <- base::signalCondition [15:31:52.156] sys.calls <- base::sys.calls [15:31:52.156] `[[` <- base::`[[` [15:31:52.156] `+` <- base::`+` [15:31:52.156] `<<-` <- base::`<<-` [15:31:52.156] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:52.156] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:52.156] 3L)] [15:31:52.156] } [15:31:52.156] function(cond) { [15:31:52.156] is_error <- inherits(cond, "error") [15:31:52.156] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:52.156] NULL) [15:31:52.156] if (is_error) { [15:31:52.156] sessionInformation <- function() { [15:31:52.156] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:52.156] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:52.156] search = base::search(), system = base::Sys.info()) [15:31:52.156] } [15:31:52.156] ...future.conditions[[length(...future.conditions) + [15:31:52.156] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:52.156] cond$call), session = sessionInformation(), [15:31:52.156] timestamp = base::Sys.time(), signaled = 0L) [15:31:52.156] signalCondition(cond) [15:31:52.156] } [15:31:52.156] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:52.156] "immediateCondition"))) { [15:31:52.156] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:52.156] ...future.conditions[[length(...future.conditions) + [15:31:52.156] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:52.156] if (TRUE && !signal) { [15:31:52.156] muffleCondition <- function (cond, pattern = "^muffle") [15:31:52.156] { [15:31:52.156] inherits <- base::inherits [15:31:52.156] invokeRestart <- base::invokeRestart [15:31:52.156] is.null <- base::is.null [15:31:52.156] muffled <- FALSE [15:31:52.156] if (inherits(cond, "message")) { [15:31:52.156] muffled <- grepl(pattern, "muffleMessage") [15:31:52.156] if (muffled) [15:31:52.156] invokeRestart("muffleMessage") [15:31:52.156] } [15:31:52.156] else if (inherits(cond, "warning")) { [15:31:52.156] muffled <- grepl(pattern, "muffleWarning") [15:31:52.156] if (muffled) [15:31:52.156] invokeRestart("muffleWarning") [15:31:52.156] } [15:31:52.156] else if (inherits(cond, "condition")) { [15:31:52.156] if (!is.null(pattern)) { [15:31:52.156] computeRestarts <- base::computeRestarts [15:31:52.156] grepl <- base::grepl [15:31:52.156] restarts <- computeRestarts(cond) [15:31:52.156] for (restart in restarts) { [15:31:52.156] name <- restart$name [15:31:52.156] if (is.null(name)) [15:31:52.156] next [15:31:52.156] if (!grepl(pattern, name)) [15:31:52.156] next [15:31:52.156] invokeRestart(restart) [15:31:52.156] muffled <- TRUE [15:31:52.156] break [15:31:52.156] } [15:31:52.156] } [15:31:52.156] } [15:31:52.156] invisible(muffled) [15:31:52.156] } [15:31:52.156] muffleCondition(cond, pattern = "^muffle") [15:31:52.156] } [15:31:52.156] } [15:31:52.156] else { [15:31:52.156] if (TRUE) { [15:31:52.156] muffleCondition <- function (cond, pattern = "^muffle") [15:31:52.156] { [15:31:52.156] inherits <- base::inherits [15:31:52.156] invokeRestart <- base::invokeRestart [15:31:52.156] is.null <- base::is.null [15:31:52.156] muffled <- FALSE [15:31:52.156] if (inherits(cond, "message")) { [15:31:52.156] muffled <- grepl(pattern, "muffleMessage") [15:31:52.156] if (muffled) [15:31:52.156] invokeRestart("muffleMessage") [15:31:52.156] } [15:31:52.156] else if (inherits(cond, "warning")) { [15:31:52.156] muffled <- grepl(pattern, "muffleWarning") [15:31:52.156] if (muffled) [15:31:52.156] invokeRestart("muffleWarning") [15:31:52.156] } [15:31:52.156] else if (inherits(cond, "condition")) { [15:31:52.156] if (!is.null(pattern)) { [15:31:52.156] computeRestarts <- base::computeRestarts [15:31:52.156] grepl <- base::grepl [15:31:52.156] restarts <- computeRestarts(cond) [15:31:52.156] for (restart in restarts) { [15:31:52.156] name <- restart$name [15:31:52.156] if (is.null(name)) [15:31:52.156] next [15:31:52.156] if (!grepl(pattern, name)) [15:31:52.156] next [15:31:52.156] invokeRestart(restart) [15:31:52.156] muffled <- TRUE [15:31:52.156] break [15:31:52.156] } [15:31:52.156] } [15:31:52.156] } [15:31:52.156] invisible(muffled) [15:31:52.156] } [15:31:52.156] muffleCondition(cond, pattern = "^muffle") [15:31:52.156] } [15:31:52.156] } [15:31:52.156] } [15:31:52.156] })) [15:31:52.156] }, error = function(ex) { [15:31:52.156] base::structure(base::list(value = NULL, visible = NULL, [15:31:52.156] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:52.156] ...future.rng), started = ...future.startTime, [15:31:52.156] finished = Sys.time(), session_uuid = NA_character_, [15:31:52.156] version = "1.8"), class = "FutureResult") [15:31:52.156] }, finally = { [15:31:52.156] if (!identical(...future.workdir, getwd())) [15:31:52.156] setwd(...future.workdir) [15:31:52.156] { [15:31:52.156] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:52.156] ...future.oldOptions$nwarnings <- NULL [15:31:52.156] } [15:31:52.156] base::options(...future.oldOptions) [15:31:52.156] if (.Platform$OS.type == "windows") { [15:31:52.156] old_names <- names(...future.oldEnvVars) [15:31:52.156] envs <- base::Sys.getenv() [15:31:52.156] names <- names(envs) [15:31:52.156] common <- intersect(names, old_names) [15:31:52.156] added <- setdiff(names, old_names) [15:31:52.156] removed <- setdiff(old_names, names) [15:31:52.156] changed <- common[...future.oldEnvVars[common] != [15:31:52.156] envs[common]] [15:31:52.156] NAMES <- toupper(changed) [15:31:52.156] args <- list() [15:31:52.156] for (kk in seq_along(NAMES)) { [15:31:52.156] name <- changed[[kk]] [15:31:52.156] NAME <- NAMES[[kk]] [15:31:52.156] if (name != NAME && is.element(NAME, old_names)) [15:31:52.156] next [15:31:52.156] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:52.156] } [15:31:52.156] NAMES <- toupper(added) [15:31:52.156] for (kk in seq_along(NAMES)) { [15:31:52.156] name <- added[[kk]] [15:31:52.156] NAME <- NAMES[[kk]] [15:31:52.156] if (name != NAME && is.element(NAME, old_names)) [15:31:52.156] next [15:31:52.156] args[[name]] <- "" [15:31:52.156] } [15:31:52.156] NAMES <- toupper(removed) [15:31:52.156] for (kk in seq_along(NAMES)) { [15:31:52.156] name <- removed[[kk]] [15:31:52.156] NAME <- NAMES[[kk]] [15:31:52.156] if (name != NAME && is.element(NAME, old_names)) [15:31:52.156] next [15:31:52.156] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:52.156] } [15:31:52.156] if (length(args) > 0) [15:31:52.156] base::do.call(base::Sys.setenv, args = args) [15:31:52.156] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:52.156] } [15:31:52.156] else { [15:31:52.156] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:52.156] } [15:31:52.156] { [15:31:52.156] if (base::length(...future.futureOptionsAdded) > [15:31:52.156] 0L) { [15:31:52.156] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:52.156] base::names(opts) <- ...future.futureOptionsAdded [15:31:52.156] base::options(opts) [15:31:52.156] } [15:31:52.156] { [15:31:52.156] { [15:31:52.156] NULL [15:31:52.156] RNGkind("Mersenne-Twister") [15:31:52.156] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:52.156] inherits = FALSE) [15:31:52.156] } [15:31:52.156] options(future.plan = NULL) [15:31:52.156] if (is.na(NA_character_)) [15:31:52.156] Sys.unsetenv("R_FUTURE_PLAN") [15:31:52.156] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:52.156] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:52.156] .init = FALSE) [15:31:52.156] } [15:31:52.156] } [15:31:52.156] } [15:31:52.156] }) [15:31:52.156] if (TRUE) { [15:31:52.156] base::sink(type = "output", split = FALSE) [15:31:52.156] if (TRUE) { [15:31:52.156] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:52.156] } [15:31:52.156] else { [15:31:52.156] ...future.result["stdout"] <- base::list(NULL) [15:31:52.156] } [15:31:52.156] base::close(...future.stdout) [15:31:52.156] ...future.stdout <- NULL [15:31:52.156] } [15:31:52.156] ...future.result$conditions <- ...future.conditions [15:31:52.156] ...future.result$finished <- base::Sys.time() [15:31:52.156] ...future.result [15:31:52.156] } [15:31:52.160] assign_globals() ... [15:31:52.160] List of 5 [15:31:52.160] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:52.160] $ future.call.arguments :List of 1 [15:31:52.160] ..$ length: int 2 [15:31:52.160] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.160] $ ...future.elements_ii :List of 1 [15:31:52.160] ..$ c: chr "character" [15:31:52.160] $ ...future.seeds_ii : NULL [15:31:52.160] $ ...future.globals.maxSize: NULL [15:31:52.160] - attr(*, "where")=List of 5 [15:31:52.160] ..$ ...future.FUN : [15:31:52.160] ..$ future.call.arguments : [15:31:52.160] ..$ ...future.elements_ii : [15:31:52.160] ..$ ...future.seeds_ii : [15:31:52.160] ..$ ...future.globals.maxSize: [15:31:52.160] - attr(*, "resolved")= logi FALSE [15:31:52.160] - attr(*, "total_size")= num 2240 [15:31:52.160] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.160] - attr(*, "already-done")= logi TRUE [15:31:52.169] - copied '...future.FUN' to environment [15:31:52.170] - copied 'future.call.arguments' to environment [15:31:52.170] - copied '...future.elements_ii' to environment [15:31:52.170] - copied '...future.seeds_ii' to environment [15:31:52.170] - copied '...future.globals.maxSize' to environment [15:31:52.171] assign_globals() ... done [15:31:52.171] plan(): Setting new future strategy stack: [15:31:52.171] List of future strategies: [15:31:52.171] 1. sequential: [15:31:52.171] - args: function (..., envir = parent.frame(), workers = "") [15:31:52.171] - tweaked: FALSE [15:31:52.171] - call: NULL [15:31:52.172] plan(): nbrOfWorkers() = 1 [15:31:52.174] plan(): Setting new future strategy stack: [15:31:52.174] List of future strategies: [15:31:52.174] 1. sequential: [15:31:52.174] - args: function (..., envir = parent.frame(), workers = "") [15:31:52.174] - tweaked: FALSE [15:31:52.174] - call: plan(strategy) [15:31:52.175] plan(): nbrOfWorkers() = 1 [15:31:52.175] SequentialFuture started (and completed) [15:31:52.175] - Launch lazy future ... done [15:31:52.176] run() for 'SequentialFuture' ... done [15:31:52.176] Created future: [15:31:52.176] SequentialFuture: [15:31:52.176] Label: 'future_lapply-3' [15:31:52.176] Expression: [15:31:52.176] { [15:31:52.176] do.call(function(...) { [15:31:52.176] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.176] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:52.176] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.176] on.exit(options(oopts), add = TRUE) [15:31:52.176] } [15:31:52.176] { [15:31:52.176] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:52.176] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.176] ...future.FUN(...future.X_jj, ...) [15:31:52.176] }) [15:31:52.176] } [15:31:52.176] }, args = future.call.arguments) [15:31:52.176] } [15:31:52.176] Lazy evaluation: FALSE [15:31:52.176] Asynchronous evaluation: FALSE [15:31:52.176] Local evaluation: TRUE [15:31:52.176] Environment: R_GlobalEnv [15:31:52.176] Capture standard output: TRUE [15:31:52.176] Capture condition classes: 'condition' (excluding 'nothing') [15:31:52.176] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 120 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:52.176] Packages: [15:31:52.176] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:52.176] Resolved: TRUE [15:31:52.176] Value: 120 bytes of class 'list' [15:31:52.176] Early signaling: FALSE [15:31:52.176] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:52.176] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:52.177] Chunk #3 of 4 ... DONE [15:31:52.178] Chunk #4 of 4 ... [15:31:52.178] - Finding globals in 'X' for chunk #4 ... [15:31:52.178] getGlobalsAndPackages() ... [15:31:52.178] Searching for globals... [15:31:52.179] [15:31:52.179] Searching for globals ... DONE [15:31:52.179] - globals: [0] [15:31:52.179] getGlobalsAndPackages() ... DONE [15:31:52.179] + additional globals found: [n=0] [15:31:52.180] + additional namespaces needed: [n=0] [15:31:52.180] - Finding globals in 'X' for chunk #4 ... DONE [15:31:52.180] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:52.180] - seeds: [15:31:52.180] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.180] getGlobalsAndPackages() ... [15:31:52.181] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.181] Resolving globals: FALSE [15:31:52.181] Tweak future expression to call with '...' arguments ... [15:31:52.181] { [15:31:52.181] do.call(function(...) { [15:31:52.181] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.181] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:52.181] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.181] on.exit(options(oopts), add = TRUE) [15:31:52.181] } [15:31:52.181] { [15:31:52.181] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:52.181] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.181] ...future.FUN(...future.X_jj, ...) [15:31:52.181] }) [15:31:52.181] } [15:31:52.181] }, args = future.call.arguments) [15:31:52.181] } [15:31:52.182] Tweak future expression to call with '...' arguments ... DONE [15:31:52.182] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.183] [15:31:52.183] getGlobalsAndPackages() ... DONE [15:31:52.183] run() for 'Future' ... [15:31:52.183] - state: 'created' [15:31:52.184] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:52.184] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:52.184] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:52.184] - Field: 'label' [15:31:52.185] - Field: 'local' [15:31:52.185] - Field: 'owner' [15:31:52.185] - Field: 'envir' [15:31:52.185] - Field: 'packages' [15:31:52.185] - Field: 'gc' [15:31:52.185] - Field: 'conditions' [15:31:52.186] - Field: 'expr' [15:31:52.186] - Field: 'uuid' [15:31:52.186] - Field: 'seed' [15:31:52.186] - Field: 'version' [15:31:52.186] - Field: 'result' [15:31:52.187] - Field: 'asynchronous' [15:31:52.187] - Field: 'calls' [15:31:52.187] - Field: 'globals' [15:31:52.187] - Field: 'stdout' [15:31:52.187] - Field: 'earlySignal' [15:31:52.188] - Field: 'lazy' [15:31:52.188] - Field: 'state' [15:31:52.188] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:52.188] - Launch lazy future ... [15:31:52.188] Packages needed by the future expression (n = 0): [15:31:52.189] Packages needed by future strategies (n = 0): [15:31:52.189] { [15:31:52.189] { [15:31:52.189] { [15:31:52.189] ...future.startTime <- base::Sys.time() [15:31:52.189] { [15:31:52.189] { [15:31:52.189] { [15:31:52.189] base::local({ [15:31:52.189] has_future <- base::requireNamespace("future", [15:31:52.189] quietly = TRUE) [15:31:52.189] if (has_future) { [15:31:52.189] ns <- base::getNamespace("future") [15:31:52.189] version <- ns[[".package"]][["version"]] [15:31:52.189] if (is.null(version)) [15:31:52.189] version <- utils::packageVersion("future") [15:31:52.189] } [15:31:52.189] else { [15:31:52.189] version <- NULL [15:31:52.189] } [15:31:52.189] if (!has_future || version < "1.8.0") { [15:31:52.189] info <- base::c(r_version = base::gsub("R version ", [15:31:52.189] "", base::R.version$version.string), [15:31:52.189] platform = base::sprintf("%s (%s-bit)", [15:31:52.189] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:52.189] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:52.189] "release", "version")], collapse = " "), [15:31:52.189] hostname = base::Sys.info()[["nodename"]]) [15:31:52.189] info <- base::sprintf("%s: %s", base::names(info), [15:31:52.189] info) [15:31:52.189] info <- base::paste(info, collapse = "; ") [15:31:52.189] if (!has_future) { [15:31:52.189] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:52.189] info) [15:31:52.189] } [15:31:52.189] else { [15:31:52.189] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:52.189] info, version) [15:31:52.189] } [15:31:52.189] base::stop(msg) [15:31:52.189] } [15:31:52.189] }) [15:31:52.189] } [15:31:52.189] ...future.strategy.old <- future::plan("list") [15:31:52.189] options(future.plan = NULL) [15:31:52.189] Sys.unsetenv("R_FUTURE_PLAN") [15:31:52.189] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:52.189] } [15:31:52.189] ...future.workdir <- getwd() [15:31:52.189] } [15:31:52.189] ...future.oldOptions <- base::as.list(base::.Options) [15:31:52.189] ...future.oldEnvVars <- base::Sys.getenv() [15:31:52.189] } [15:31:52.189] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:52.189] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:52.189] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:52.189] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:52.189] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:52.189] future.stdout.windows.reencode = NULL, width = 80L) [15:31:52.189] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:52.189] base::names(...future.oldOptions)) [15:31:52.189] } [15:31:52.189] if (FALSE) { [15:31:52.189] } [15:31:52.189] else { [15:31:52.189] if (TRUE) { [15:31:52.189] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:52.189] open = "w") [15:31:52.189] } [15:31:52.189] else { [15:31:52.189] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:52.189] windows = "NUL", "/dev/null"), open = "w") [15:31:52.189] } [15:31:52.189] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:52.189] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:52.189] base::sink(type = "output", split = FALSE) [15:31:52.189] base::close(...future.stdout) [15:31:52.189] }, add = TRUE) [15:31:52.189] } [15:31:52.189] ...future.frame <- base::sys.nframe() [15:31:52.189] ...future.conditions <- base::list() [15:31:52.189] ...future.rng <- base::globalenv()$.Random.seed [15:31:52.189] if (FALSE) { [15:31:52.189] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:52.189] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:52.189] } [15:31:52.189] ...future.result <- base::tryCatch({ [15:31:52.189] base::withCallingHandlers({ [15:31:52.189] ...future.value <- base::withVisible(base::local({ [15:31:52.189] do.call(function(...) { [15:31:52.189] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.189] if (!identical(...future.globals.maxSize.org, [15:31:52.189] ...future.globals.maxSize)) { [15:31:52.189] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.189] on.exit(options(oopts), add = TRUE) [15:31:52.189] } [15:31:52.189] { [15:31:52.189] lapply(seq_along(...future.elements_ii), [15:31:52.189] FUN = function(jj) { [15:31:52.189] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.189] ...future.FUN(...future.X_jj, ...) [15:31:52.189] }) [15:31:52.189] } [15:31:52.189] }, args = future.call.arguments) [15:31:52.189] })) [15:31:52.189] future::FutureResult(value = ...future.value$value, [15:31:52.189] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:52.189] ...future.rng), globalenv = if (FALSE) [15:31:52.189] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:52.189] ...future.globalenv.names)) [15:31:52.189] else NULL, started = ...future.startTime, version = "1.8") [15:31:52.189] }, condition = base::local({ [15:31:52.189] c <- base::c [15:31:52.189] inherits <- base::inherits [15:31:52.189] invokeRestart <- base::invokeRestart [15:31:52.189] length <- base::length [15:31:52.189] list <- base::list [15:31:52.189] seq.int <- base::seq.int [15:31:52.189] signalCondition <- base::signalCondition [15:31:52.189] sys.calls <- base::sys.calls [15:31:52.189] `[[` <- base::`[[` [15:31:52.189] `+` <- base::`+` [15:31:52.189] `<<-` <- base::`<<-` [15:31:52.189] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:52.189] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:52.189] 3L)] [15:31:52.189] } [15:31:52.189] function(cond) { [15:31:52.189] is_error <- inherits(cond, "error") [15:31:52.189] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:52.189] NULL) [15:31:52.189] if (is_error) { [15:31:52.189] sessionInformation <- function() { [15:31:52.189] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:52.189] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:52.189] search = base::search(), system = base::Sys.info()) [15:31:52.189] } [15:31:52.189] ...future.conditions[[length(...future.conditions) + [15:31:52.189] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:52.189] cond$call), session = sessionInformation(), [15:31:52.189] timestamp = base::Sys.time(), signaled = 0L) [15:31:52.189] signalCondition(cond) [15:31:52.189] } [15:31:52.189] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:52.189] "immediateCondition"))) { [15:31:52.189] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:52.189] ...future.conditions[[length(...future.conditions) + [15:31:52.189] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:52.189] if (TRUE && !signal) { [15:31:52.189] muffleCondition <- function (cond, pattern = "^muffle") [15:31:52.189] { [15:31:52.189] inherits <- base::inherits [15:31:52.189] invokeRestart <- base::invokeRestart [15:31:52.189] is.null <- base::is.null [15:31:52.189] muffled <- FALSE [15:31:52.189] if (inherits(cond, "message")) { [15:31:52.189] muffled <- grepl(pattern, "muffleMessage") [15:31:52.189] if (muffled) [15:31:52.189] invokeRestart("muffleMessage") [15:31:52.189] } [15:31:52.189] else if (inherits(cond, "warning")) { [15:31:52.189] muffled <- grepl(pattern, "muffleWarning") [15:31:52.189] if (muffled) [15:31:52.189] invokeRestart("muffleWarning") [15:31:52.189] } [15:31:52.189] else if (inherits(cond, "condition")) { [15:31:52.189] if (!is.null(pattern)) { [15:31:52.189] computeRestarts <- base::computeRestarts [15:31:52.189] grepl <- base::grepl [15:31:52.189] restarts <- computeRestarts(cond) [15:31:52.189] for (restart in restarts) { [15:31:52.189] name <- restart$name [15:31:52.189] if (is.null(name)) [15:31:52.189] next [15:31:52.189] if (!grepl(pattern, name)) [15:31:52.189] next [15:31:52.189] invokeRestart(restart) [15:31:52.189] muffled <- TRUE [15:31:52.189] break [15:31:52.189] } [15:31:52.189] } [15:31:52.189] } [15:31:52.189] invisible(muffled) [15:31:52.189] } [15:31:52.189] muffleCondition(cond, pattern = "^muffle") [15:31:52.189] } [15:31:52.189] } [15:31:52.189] else { [15:31:52.189] if (TRUE) { [15:31:52.189] muffleCondition <- function (cond, pattern = "^muffle") [15:31:52.189] { [15:31:52.189] inherits <- base::inherits [15:31:52.189] invokeRestart <- base::invokeRestart [15:31:52.189] is.null <- base::is.null [15:31:52.189] muffled <- FALSE [15:31:52.189] if (inherits(cond, "message")) { [15:31:52.189] muffled <- grepl(pattern, "muffleMessage") [15:31:52.189] if (muffled) [15:31:52.189] invokeRestart("muffleMessage") [15:31:52.189] } [15:31:52.189] else if (inherits(cond, "warning")) { [15:31:52.189] muffled <- grepl(pattern, "muffleWarning") [15:31:52.189] if (muffled) [15:31:52.189] invokeRestart("muffleWarning") [15:31:52.189] } [15:31:52.189] else if (inherits(cond, "condition")) { [15:31:52.189] if (!is.null(pattern)) { [15:31:52.189] computeRestarts <- base::computeRestarts [15:31:52.189] grepl <- base::grepl [15:31:52.189] restarts <- computeRestarts(cond) [15:31:52.189] for (restart in restarts) { [15:31:52.189] name <- restart$name [15:31:52.189] if (is.null(name)) [15:31:52.189] next [15:31:52.189] if (!grepl(pattern, name)) [15:31:52.189] next [15:31:52.189] invokeRestart(restart) [15:31:52.189] muffled <- TRUE [15:31:52.189] break [15:31:52.189] } [15:31:52.189] } [15:31:52.189] } [15:31:52.189] invisible(muffled) [15:31:52.189] } [15:31:52.189] muffleCondition(cond, pattern = "^muffle") [15:31:52.189] } [15:31:52.189] } [15:31:52.189] } [15:31:52.189] })) [15:31:52.189] }, error = function(ex) { [15:31:52.189] base::structure(base::list(value = NULL, visible = NULL, [15:31:52.189] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:52.189] ...future.rng), started = ...future.startTime, [15:31:52.189] finished = Sys.time(), session_uuid = NA_character_, [15:31:52.189] version = "1.8"), class = "FutureResult") [15:31:52.189] }, finally = { [15:31:52.189] if (!identical(...future.workdir, getwd())) [15:31:52.189] setwd(...future.workdir) [15:31:52.189] { [15:31:52.189] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:52.189] ...future.oldOptions$nwarnings <- NULL [15:31:52.189] } [15:31:52.189] base::options(...future.oldOptions) [15:31:52.189] if (.Platform$OS.type == "windows") { [15:31:52.189] old_names <- names(...future.oldEnvVars) [15:31:52.189] envs <- base::Sys.getenv() [15:31:52.189] names <- names(envs) [15:31:52.189] common <- intersect(names, old_names) [15:31:52.189] added <- setdiff(names, old_names) [15:31:52.189] removed <- setdiff(old_names, names) [15:31:52.189] changed <- common[...future.oldEnvVars[common] != [15:31:52.189] envs[common]] [15:31:52.189] NAMES <- toupper(changed) [15:31:52.189] args <- list() [15:31:52.189] for (kk in seq_along(NAMES)) { [15:31:52.189] name <- changed[[kk]] [15:31:52.189] NAME <- NAMES[[kk]] [15:31:52.189] if (name != NAME && is.element(NAME, old_names)) [15:31:52.189] next [15:31:52.189] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:52.189] } [15:31:52.189] NAMES <- toupper(added) [15:31:52.189] for (kk in seq_along(NAMES)) { [15:31:52.189] name <- added[[kk]] [15:31:52.189] NAME <- NAMES[[kk]] [15:31:52.189] if (name != NAME && is.element(NAME, old_names)) [15:31:52.189] next [15:31:52.189] args[[name]] <- "" [15:31:52.189] } [15:31:52.189] NAMES <- toupper(removed) [15:31:52.189] for (kk in seq_along(NAMES)) { [15:31:52.189] name <- removed[[kk]] [15:31:52.189] NAME <- NAMES[[kk]] [15:31:52.189] if (name != NAME && is.element(NAME, old_names)) [15:31:52.189] next [15:31:52.189] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:52.189] } [15:31:52.189] if (length(args) > 0) [15:31:52.189] base::do.call(base::Sys.setenv, args = args) [15:31:52.189] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:52.189] } [15:31:52.189] else { [15:31:52.189] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:52.189] } [15:31:52.189] { [15:31:52.189] if (base::length(...future.futureOptionsAdded) > [15:31:52.189] 0L) { [15:31:52.189] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:52.189] base::names(opts) <- ...future.futureOptionsAdded [15:31:52.189] base::options(opts) [15:31:52.189] } [15:31:52.189] { [15:31:52.189] { [15:31:52.189] NULL [15:31:52.189] RNGkind("Mersenne-Twister") [15:31:52.189] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:52.189] inherits = FALSE) [15:31:52.189] } [15:31:52.189] options(future.plan = NULL) [15:31:52.189] if (is.na(NA_character_)) [15:31:52.189] Sys.unsetenv("R_FUTURE_PLAN") [15:31:52.189] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:52.189] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:52.189] .init = FALSE) [15:31:52.189] } [15:31:52.189] } [15:31:52.189] } [15:31:52.189] }) [15:31:52.189] if (TRUE) { [15:31:52.189] base::sink(type = "output", split = FALSE) [15:31:52.189] if (TRUE) { [15:31:52.189] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:52.189] } [15:31:52.189] else { [15:31:52.189] ...future.result["stdout"] <- base::list(NULL) [15:31:52.189] } [15:31:52.189] base::close(...future.stdout) [15:31:52.189] ...future.stdout <- NULL [15:31:52.189] } [15:31:52.189] ...future.result$conditions <- ...future.conditions [15:31:52.189] ...future.result$finished <- base::Sys.time() [15:31:52.189] ...future.result [15:31:52.189] } [15:31:52.193] assign_globals() ... [15:31:52.193] List of 5 [15:31:52.193] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:52.193] $ future.call.arguments :List of 1 [15:31:52.193] ..$ length: int 2 [15:31:52.193] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.193] $ ...future.elements_ii :List of 1 [15:31:52.193] ..$ c: chr "list" [15:31:52.193] $ ...future.seeds_ii : NULL [15:31:52.193] $ ...future.globals.maxSize: NULL [15:31:52.193] - attr(*, "where")=List of 5 [15:31:52.193] ..$ ...future.FUN : [15:31:52.193] ..$ future.call.arguments : [15:31:52.193] ..$ ...future.elements_ii : [15:31:52.193] ..$ ...future.seeds_ii : [15:31:52.193] ..$ ...future.globals.maxSize: [15:31:52.193] - attr(*, "resolved")= logi FALSE [15:31:52.193] - attr(*, "total_size")= num 2240 [15:31:52.193] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.193] - attr(*, "already-done")= logi TRUE [15:31:52.200] - copied '...future.FUN' to environment [15:31:52.201] - copied 'future.call.arguments' to environment [15:31:52.201] - copied '...future.elements_ii' to environment [15:31:52.201] - copied '...future.seeds_ii' to environment [15:31:52.201] - copied '...future.globals.maxSize' to environment [15:31:52.201] assign_globals() ... done [15:31:52.202] plan(): Setting new future strategy stack: [15:31:52.202] List of future strategies: [15:31:52.202] 1. sequential: [15:31:52.202] - args: function (..., envir = parent.frame(), workers = "") [15:31:52.202] - tweaked: FALSE [15:31:52.202] - call: NULL [15:31:52.203] plan(): nbrOfWorkers() = 1 [15:31:52.205] plan(): Setting new future strategy stack: [15:31:52.205] List of future strategies: [15:31:52.205] 1. sequential: [15:31:52.205] - args: function (..., envir = parent.frame(), workers = "") [15:31:52.205] - tweaked: FALSE [15:31:52.205] - call: plan(strategy) [15:31:52.206] plan(): nbrOfWorkers() = 1 [15:31:52.207] SequentialFuture started (and completed) [15:31:52.207] - Launch lazy future ... done [15:31:52.207] run() for 'SequentialFuture' ... done [15:31:52.208] Created future: [15:31:52.208] SequentialFuture: [15:31:52.208] Label: 'future_lapply-4' [15:31:52.208] Expression: [15:31:52.208] { [15:31:52.208] do.call(function(...) { [15:31:52.208] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.208] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:52.208] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.208] on.exit(options(oopts), add = TRUE) [15:31:52.208] } [15:31:52.208] { [15:31:52.208] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:52.208] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.208] ...future.FUN(...future.X_jj, ...) [15:31:52.208] }) [15:31:52.208] } [15:31:52.208] }, args = future.call.arguments) [15:31:52.208] } [15:31:52.208] Lazy evaluation: FALSE [15:31:52.208] Asynchronous evaluation: FALSE [15:31:52.208] Local evaluation: TRUE [15:31:52.208] Environment: R_GlobalEnv [15:31:52.208] Capture standard output: TRUE [15:31:52.208] Capture condition classes: 'condition' (excluding 'nothing') [15:31:52.208] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:52.208] Packages: [15:31:52.208] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:52.208] Resolved: TRUE [15:31:52.208] Value: 0 bytes of class 'list' [15:31:52.208] Early signaling: FALSE [15:31:52.208] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:52.208] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:52.210] Chunk #4 of 4 ... DONE [15:31:52.210] Launching 4 futures (chunks) ... DONE [15:31:52.211] Resolving 4 futures (chunks) ... [15:31:52.211] resolve() on list ... [15:31:52.211] recursive: 0 [15:31:52.211] length: 4 [15:31:52.212] [15:31:52.212] resolved() for 'SequentialFuture' ... [15:31:52.212] - state: 'finished' [15:31:52.213] - run: TRUE [15:31:52.213] - result: 'FutureResult' [15:31:52.213] resolved() for 'SequentialFuture' ... done [15:31:52.213] Future #1 [15:31:52.214] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:52.214] - nx: 4 [15:31:52.214] - relay: TRUE [15:31:52.215] - stdout: TRUE [15:31:52.215] - signal: TRUE [15:31:52.215] - resignal: FALSE [15:31:52.215] - force: TRUE [15:31:52.216] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [15:31:52.216] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [15:31:52.216] - until=1 [15:31:52.216] - relaying element #1 [15:31:52.217] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:52.217] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:52.217] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:52.218] length: 3 (resolved future 1) [15:31:52.218] resolved() for 'SequentialFuture' ... [15:31:52.218] - state: 'finished' [15:31:52.219] - run: TRUE [15:31:52.219] - result: 'FutureResult' [15:31:52.219] resolved() for 'SequentialFuture' ... done [15:31:52.219] Future #2 [15:31:52.220] signalConditionsASAP(SequentialFuture, pos=2) ... [15:31:52.220] - nx: 4 [15:31:52.220] - relay: TRUE [15:31:52.221] - stdout: TRUE [15:31:52.221] - signal: TRUE [15:31:52.221] - resignal: FALSE [15:31:52.221] - force: TRUE [15:31:52.222] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:52.222] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:52.222] - until=2 [15:31:52.222] - relaying element #2 [15:31:52.223] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:52.223] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:52.224] signalConditionsASAP(SequentialFuture, pos=2) ... done [15:31:52.224] length: 2 (resolved future 2) [15:31:52.224] resolved() for 'SequentialFuture' ... [15:31:52.225] - state: 'finished' [15:31:52.225] - run: TRUE [15:31:52.225] - result: 'FutureResult' [15:31:52.225] resolved() for 'SequentialFuture' ... done [15:31:52.225] Future #3 [15:31:52.226] signalConditionsASAP(SequentialFuture, pos=3) ... [15:31:52.226] - nx: 4 [15:31:52.226] - relay: TRUE [15:31:52.227] - stdout: TRUE [15:31:52.227] - signal: TRUE [15:31:52.227] - resignal: FALSE [15:31:52.227] - force: TRUE [15:31:52.227] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:52.227] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:52.228] - until=3 [15:31:52.228] - relaying element #3 [15:31:52.228] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:52.229] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:52.229] signalConditionsASAP(SequentialFuture, pos=3) ... done [15:31:52.229] length: 1 (resolved future 3) [15:31:52.229] resolved() for 'SequentialFuture' ... [15:31:52.230] - state: 'finished' [15:31:52.230] - run: TRUE [15:31:52.230] - result: 'FutureResult' [15:31:52.231] resolved() for 'SequentialFuture' ... done [15:31:52.231] Future #4 [15:31:52.231] signalConditionsASAP(SequentialFuture, pos=4) ... [15:31:52.232] - nx: 4 [15:31:52.232] - relay: TRUE [15:31:52.232] - stdout: TRUE [15:31:52.232] - signal: TRUE [15:31:52.233] - resignal: FALSE [15:31:52.233] - force: TRUE [15:31:52.233] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:52.233] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:52.234] - until=4 [15:31:52.234] - relaying element #4 [15:31:52.234] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:52.234] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:52.235] signalConditionsASAP(SequentialFuture, pos=4) ... done [15:31:52.235] length: 0 (resolved future 4) [15:31:52.235] Relaying remaining futures [15:31:52.236] signalConditionsASAP(NULL, pos=0) ... [15:31:52.236] - nx: 4 [15:31:52.236] - relay: TRUE [15:31:52.236] - stdout: TRUE [15:31:52.236] - signal: TRUE [15:31:52.236] - resignal: FALSE [15:31:52.237] - force: TRUE [15:31:52.237] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:52.237] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [15:31:52.237] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:52.238] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:52.238] signalConditionsASAP(NULL, pos=0) ... done [15:31:52.238] resolve() on list ... DONE [15:31:52.239] - Number of value chunks collected: 4 [15:31:52.239] Resolving 4 futures (chunks) ... DONE [15:31:52.239] Reducing values from 4 chunks ... [15:31:52.239] - Number of values collected after concatenation: 4 [15:31:52.239] - Number of values expected: 4 [15:31:52.239] Reducing values from 4 chunks ... DONE [15:31:52.240] 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, ...) ... [15:31:52.243] future_lapply() ... [15:31:52.252] Number of chunks: 1 [15:31:52.252] getGlobalsAndPackagesXApply() ... [15:31:52.255] - future.globals: TRUE [15:31:52.256] getGlobalsAndPackages() ... [15:31:52.256] Searching for globals... [15:31:52.266] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [15:31:52.266] Searching for globals ... DONE [15:31:52.267] Resolving globals: FALSE [15:31:52.268] The total size of the 1 globals is 69.62 KiB (71288 bytes) [15:31:52.268] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 69.62 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (69.62 KiB of class 'function') [15:31:52.268] - globals: [1] 'FUN' [15:31:52.269] - packages: [1] 'future' [15:31:52.269] getGlobalsAndPackages() ... DONE [15:31:52.269] - globals found/used: [n=1] 'FUN' [15:31:52.269] - needed namespaces: [n=1] 'future' [15:31:52.269] Finding globals ... DONE [15:31:52.270] - use_args: TRUE [15:31:52.270] - Getting '...' globals ... [15:31:52.270] resolve() on list ... [15:31:52.270] recursive: 0 [15:31:52.271] length: 1 [15:31:52.271] elements: '...' [15:31:52.271] length: 0 (resolved future 1) [15:31:52.272] resolve() on list ... DONE [15:31:52.272] - '...' content: [n=2] 'collapse', 'maxHead' [15:31:52.272] List of 1 [15:31:52.272] $ ...:List of 2 [15:31:52.272] ..$ collapse: chr "; " [15:31:52.272] ..$ maxHead : int 3 [15:31:52.272] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.272] - attr(*, "where")=List of 1 [15:31:52.272] ..$ ...: [15:31:52.272] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.272] - attr(*, "resolved")= logi TRUE [15:31:52.272] - attr(*, "total_size")= num NA [15:31:52.278] - Getting '...' globals ... DONE [15:31:52.279] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:52.279] List of 2 [15:31:52.279] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:52.279] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:52.279] $ ... :List of 2 [15:31:52.279] ..$ collapse: chr "; " [15:31:52.279] ..$ maxHead : int 3 [15:31:52.279] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.279] - attr(*, "where")=List of 2 [15:31:52.279] ..$ ...future.FUN: [15:31:52.279] ..$ ... : [15:31:52.279] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.279] - attr(*, "resolved")= logi FALSE [15:31:52.279] - attr(*, "total_size")= num 71456 [15:31:52.283] Packages to be attached in all futures: [n=1] 'future' [15:31:52.284] getGlobalsAndPackagesXApply() ... DONE [15:31:52.284] Number of futures (= number of chunks): 1 [15:31:52.284] Launching 1 futures (chunks) ... [15:31:52.284] Chunk #1 of 1 ... [15:31:52.285] - Finding globals in 'X' for chunk #1 ... [15:31:52.285] getGlobalsAndPackages() ... [15:31:52.285] Searching for globals... [15:31:52.285] [15:31:52.285] Searching for globals ... DONE [15:31:52.286] - globals: [0] [15:31:52.286] getGlobalsAndPackages() ... DONE [15:31:52.286] + additional globals found: [n=0] [15:31:52.286] + additional namespaces needed: [n=0] [15:31:52.286] - Finding globals in 'X' for chunk #1 ... DONE [15:31:52.286] - seeds: [15:31:52.287] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.287] getGlobalsAndPackages() ... [15:31:52.287] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.287] Resolving globals: FALSE [15:31:52.287] Tweak future expression to call with '...' arguments ... [15:31:52.288] { [15:31:52.288] do.call(function(...) { [15:31:52.288] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.288] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:52.288] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.288] on.exit(options(oopts), add = TRUE) [15:31:52.288] } [15:31:52.288] { [15:31:52.288] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:52.288] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.288] ...future.FUN(...future.X_jj, ...) [15:31:52.288] }) [15:31:52.288] } [15:31:52.288] }, args = future.call.arguments) [15:31:52.288] } [15:31:52.288] Tweak future expression to call with '...' arguments ... DONE [15:31:52.289] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.289] - packages: [1] 'future' [15:31:52.289] getGlobalsAndPackages() ... DONE [15:31:52.289] run() for 'Future' ... [15:31:52.290] - state: 'created' [15:31:52.290] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:52.290] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:52.291] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:52.291] - Field: 'label' [15:31:52.291] - Field: 'local' [15:31:52.291] - Field: 'owner' [15:31:52.291] - Field: 'envir' [15:31:52.292] - Field: 'packages' [15:31:52.292] - Field: 'gc' [15:31:52.292] - Field: 'conditions' [15:31:52.292] - Field: 'expr' [15:31:52.292] - Field: 'uuid' [15:31:52.292] - Field: 'seed' [15:31:52.293] - Field: 'version' [15:31:52.293] - Field: 'result' [15:31:52.293] - Field: 'asynchronous' [15:31:52.293] - Field: 'calls' [15:31:52.293] - Field: 'globals' [15:31:52.294] - Field: 'stdout' [15:31:52.294] - Field: 'earlySignal' [15:31:52.294] - Field: 'lazy' [15:31:52.294] - Field: 'state' [15:31:52.294] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:52.294] - Launch lazy future ... [15:31:52.295] Packages needed by the future expression (n = 1): 'future' [15:31:52.295] Packages needed by future strategies (n = 0): [15:31:52.296] { [15:31:52.296] { [15:31:52.296] { [15:31:52.296] ...future.startTime <- base::Sys.time() [15:31:52.296] { [15:31:52.296] { [15:31:52.296] { [15:31:52.296] { [15:31:52.296] base::local({ [15:31:52.296] has_future <- base::requireNamespace("future", [15:31:52.296] quietly = TRUE) [15:31:52.296] if (has_future) { [15:31:52.296] ns <- base::getNamespace("future") [15:31:52.296] version <- ns[[".package"]][["version"]] [15:31:52.296] if (is.null(version)) [15:31:52.296] version <- utils::packageVersion("future") [15:31:52.296] } [15:31:52.296] else { [15:31:52.296] version <- NULL [15:31:52.296] } [15:31:52.296] if (!has_future || version < "1.8.0") { [15:31:52.296] info <- base::c(r_version = base::gsub("R version ", [15:31:52.296] "", base::R.version$version.string), [15:31:52.296] platform = base::sprintf("%s (%s-bit)", [15:31:52.296] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:52.296] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:52.296] "release", "version")], collapse = " "), [15:31:52.296] hostname = base::Sys.info()[["nodename"]]) [15:31:52.296] info <- base::sprintf("%s: %s", base::names(info), [15:31:52.296] info) [15:31:52.296] info <- base::paste(info, collapse = "; ") [15:31:52.296] if (!has_future) { [15:31:52.296] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:52.296] info) [15:31:52.296] } [15:31:52.296] else { [15:31:52.296] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:52.296] info, version) [15:31:52.296] } [15:31:52.296] base::stop(msg) [15:31:52.296] } [15:31:52.296] }) [15:31:52.296] } [15:31:52.296] base::local({ [15:31:52.296] for (pkg in "future") { [15:31:52.296] base::loadNamespace(pkg) [15:31:52.296] base::library(pkg, character.only = TRUE) [15:31:52.296] } [15:31:52.296] }) [15:31:52.296] } [15:31:52.296] ...future.strategy.old <- future::plan("list") [15:31:52.296] options(future.plan = NULL) [15:31:52.296] Sys.unsetenv("R_FUTURE_PLAN") [15:31:52.296] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:52.296] } [15:31:52.296] ...future.workdir <- getwd() [15:31:52.296] } [15:31:52.296] ...future.oldOptions <- base::as.list(base::.Options) [15:31:52.296] ...future.oldEnvVars <- base::Sys.getenv() [15:31:52.296] } [15:31:52.296] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:52.296] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:52.296] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:52.296] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:52.296] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:52.296] future.stdout.windows.reencode = NULL, width = 80L) [15:31:52.296] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:52.296] base::names(...future.oldOptions)) [15:31:52.296] } [15:31:52.296] if (FALSE) { [15:31:52.296] } [15:31:52.296] else { [15:31:52.296] if (TRUE) { [15:31:52.296] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:52.296] open = "w") [15:31:52.296] } [15:31:52.296] else { [15:31:52.296] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:52.296] windows = "NUL", "/dev/null"), open = "w") [15:31:52.296] } [15:31:52.296] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:52.296] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:52.296] base::sink(type = "output", split = FALSE) [15:31:52.296] base::close(...future.stdout) [15:31:52.296] }, add = TRUE) [15:31:52.296] } [15:31:52.296] ...future.frame <- base::sys.nframe() [15:31:52.296] ...future.conditions <- base::list() [15:31:52.296] ...future.rng <- base::globalenv()$.Random.seed [15:31:52.296] if (FALSE) { [15:31:52.296] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:52.296] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:52.296] } [15:31:52.296] ...future.result <- base::tryCatch({ [15:31:52.296] base::withCallingHandlers({ [15:31:52.296] ...future.value <- base::withVisible(base::local({ [15:31:52.296] do.call(function(...) { [15:31:52.296] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.296] if (!identical(...future.globals.maxSize.org, [15:31:52.296] ...future.globals.maxSize)) { [15:31:52.296] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.296] on.exit(options(oopts), add = TRUE) [15:31:52.296] } [15:31:52.296] { [15:31:52.296] lapply(seq_along(...future.elements_ii), [15:31:52.296] FUN = function(jj) { [15:31:52.296] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.296] ...future.FUN(...future.X_jj, ...) [15:31:52.296] }) [15:31:52.296] } [15:31:52.296] }, args = future.call.arguments) [15:31:52.296] })) [15:31:52.296] future::FutureResult(value = ...future.value$value, [15:31:52.296] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:52.296] ...future.rng), globalenv = if (FALSE) [15:31:52.296] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:52.296] ...future.globalenv.names)) [15:31:52.296] else NULL, started = ...future.startTime, version = "1.8") [15:31:52.296] }, condition = base::local({ [15:31:52.296] c <- base::c [15:31:52.296] inherits <- base::inherits [15:31:52.296] invokeRestart <- base::invokeRestart [15:31:52.296] length <- base::length [15:31:52.296] list <- base::list [15:31:52.296] seq.int <- base::seq.int [15:31:52.296] signalCondition <- base::signalCondition [15:31:52.296] sys.calls <- base::sys.calls [15:31:52.296] `[[` <- base::`[[` [15:31:52.296] `+` <- base::`+` [15:31:52.296] `<<-` <- base::`<<-` [15:31:52.296] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:52.296] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:52.296] 3L)] [15:31:52.296] } [15:31:52.296] function(cond) { [15:31:52.296] is_error <- inherits(cond, "error") [15:31:52.296] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:52.296] NULL) [15:31:52.296] if (is_error) { [15:31:52.296] sessionInformation <- function() { [15:31:52.296] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:52.296] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:52.296] search = base::search(), system = base::Sys.info()) [15:31:52.296] } [15:31:52.296] ...future.conditions[[length(...future.conditions) + [15:31:52.296] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:52.296] cond$call), session = sessionInformation(), [15:31:52.296] timestamp = base::Sys.time(), signaled = 0L) [15:31:52.296] signalCondition(cond) [15:31:52.296] } [15:31:52.296] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:52.296] "immediateCondition"))) { [15:31:52.296] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:52.296] ...future.conditions[[length(...future.conditions) + [15:31:52.296] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:52.296] if (TRUE && !signal) { [15:31:52.296] muffleCondition <- function (cond, pattern = "^muffle") [15:31:52.296] { [15:31:52.296] inherits <- base::inherits [15:31:52.296] invokeRestart <- base::invokeRestart [15:31:52.296] is.null <- base::is.null [15:31:52.296] muffled <- FALSE [15:31:52.296] if (inherits(cond, "message")) { [15:31:52.296] muffled <- grepl(pattern, "muffleMessage") [15:31:52.296] if (muffled) [15:31:52.296] invokeRestart("muffleMessage") [15:31:52.296] } [15:31:52.296] else if (inherits(cond, "warning")) { [15:31:52.296] muffled <- grepl(pattern, "muffleWarning") [15:31:52.296] if (muffled) [15:31:52.296] invokeRestart("muffleWarning") [15:31:52.296] } [15:31:52.296] else if (inherits(cond, "condition")) { [15:31:52.296] if (!is.null(pattern)) { [15:31:52.296] computeRestarts <- base::computeRestarts [15:31:52.296] grepl <- base::grepl [15:31:52.296] restarts <- computeRestarts(cond) [15:31:52.296] for (restart in restarts) { [15:31:52.296] name <- restart$name [15:31:52.296] if (is.null(name)) [15:31:52.296] next [15:31:52.296] if (!grepl(pattern, name)) [15:31:52.296] next [15:31:52.296] invokeRestart(restart) [15:31:52.296] muffled <- TRUE [15:31:52.296] break [15:31:52.296] } [15:31:52.296] } [15:31:52.296] } [15:31:52.296] invisible(muffled) [15:31:52.296] } [15:31:52.296] muffleCondition(cond, pattern = "^muffle") [15:31:52.296] } [15:31:52.296] } [15:31:52.296] else { [15:31:52.296] if (TRUE) { [15:31:52.296] muffleCondition <- function (cond, pattern = "^muffle") [15:31:52.296] { [15:31:52.296] inherits <- base::inherits [15:31:52.296] invokeRestart <- base::invokeRestart [15:31:52.296] is.null <- base::is.null [15:31:52.296] muffled <- FALSE [15:31:52.296] if (inherits(cond, "message")) { [15:31:52.296] muffled <- grepl(pattern, "muffleMessage") [15:31:52.296] if (muffled) [15:31:52.296] invokeRestart("muffleMessage") [15:31:52.296] } [15:31:52.296] else if (inherits(cond, "warning")) { [15:31:52.296] muffled <- grepl(pattern, "muffleWarning") [15:31:52.296] if (muffled) [15:31:52.296] invokeRestart("muffleWarning") [15:31:52.296] } [15:31:52.296] else if (inherits(cond, "condition")) { [15:31:52.296] if (!is.null(pattern)) { [15:31:52.296] computeRestarts <- base::computeRestarts [15:31:52.296] grepl <- base::grepl [15:31:52.296] restarts <- computeRestarts(cond) [15:31:52.296] for (restart in restarts) { [15:31:52.296] name <- restart$name [15:31:52.296] if (is.null(name)) [15:31:52.296] next [15:31:52.296] if (!grepl(pattern, name)) [15:31:52.296] next [15:31:52.296] invokeRestart(restart) [15:31:52.296] muffled <- TRUE [15:31:52.296] break [15:31:52.296] } [15:31:52.296] } [15:31:52.296] } [15:31:52.296] invisible(muffled) [15:31:52.296] } [15:31:52.296] muffleCondition(cond, pattern = "^muffle") [15:31:52.296] } [15:31:52.296] } [15:31:52.296] } [15:31:52.296] })) [15:31:52.296] }, error = function(ex) { [15:31:52.296] base::structure(base::list(value = NULL, visible = NULL, [15:31:52.296] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:52.296] ...future.rng), started = ...future.startTime, [15:31:52.296] finished = Sys.time(), session_uuid = NA_character_, [15:31:52.296] version = "1.8"), class = "FutureResult") [15:31:52.296] }, finally = { [15:31:52.296] if (!identical(...future.workdir, getwd())) [15:31:52.296] setwd(...future.workdir) [15:31:52.296] { [15:31:52.296] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:52.296] ...future.oldOptions$nwarnings <- NULL [15:31:52.296] } [15:31:52.296] base::options(...future.oldOptions) [15:31:52.296] if (.Platform$OS.type == "windows") { [15:31:52.296] old_names <- names(...future.oldEnvVars) [15:31:52.296] envs <- base::Sys.getenv() [15:31:52.296] names <- names(envs) [15:31:52.296] common <- intersect(names, old_names) [15:31:52.296] added <- setdiff(names, old_names) [15:31:52.296] removed <- setdiff(old_names, names) [15:31:52.296] changed <- common[...future.oldEnvVars[common] != [15:31:52.296] envs[common]] [15:31:52.296] NAMES <- toupper(changed) [15:31:52.296] args <- list() [15:31:52.296] for (kk in seq_along(NAMES)) { [15:31:52.296] name <- changed[[kk]] [15:31:52.296] NAME <- NAMES[[kk]] [15:31:52.296] if (name != NAME && is.element(NAME, old_names)) [15:31:52.296] next [15:31:52.296] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:52.296] } [15:31:52.296] NAMES <- toupper(added) [15:31:52.296] for (kk in seq_along(NAMES)) { [15:31:52.296] name <- added[[kk]] [15:31:52.296] NAME <- NAMES[[kk]] [15:31:52.296] if (name != NAME && is.element(NAME, old_names)) [15:31:52.296] next [15:31:52.296] args[[name]] <- "" [15:31:52.296] } [15:31:52.296] NAMES <- toupper(removed) [15:31:52.296] for (kk in seq_along(NAMES)) { [15:31:52.296] name <- removed[[kk]] [15:31:52.296] NAME <- NAMES[[kk]] [15:31:52.296] if (name != NAME && is.element(NAME, old_names)) [15:31:52.296] next [15:31:52.296] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:52.296] } [15:31:52.296] if (length(args) > 0) [15:31:52.296] base::do.call(base::Sys.setenv, args = args) [15:31:52.296] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:52.296] } [15:31:52.296] else { [15:31:52.296] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:52.296] } [15:31:52.296] { [15:31:52.296] if (base::length(...future.futureOptionsAdded) > [15:31:52.296] 0L) { [15:31:52.296] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:52.296] base::names(opts) <- ...future.futureOptionsAdded [15:31:52.296] base::options(opts) [15:31:52.296] } [15:31:52.296] { [15:31:52.296] { [15:31:52.296] NULL [15:31:52.296] RNGkind("Mersenne-Twister") [15:31:52.296] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:52.296] inherits = FALSE) [15:31:52.296] } [15:31:52.296] options(future.plan = NULL) [15:31:52.296] if (is.na(NA_character_)) [15:31:52.296] Sys.unsetenv("R_FUTURE_PLAN") [15:31:52.296] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:52.296] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:52.296] .init = FALSE) [15:31:52.296] } [15:31:52.296] } [15:31:52.296] } [15:31:52.296] }) [15:31:52.296] if (TRUE) { [15:31:52.296] base::sink(type = "output", split = FALSE) [15:31:52.296] if (TRUE) { [15:31:52.296] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:52.296] } [15:31:52.296] else { [15:31:52.296] ...future.result["stdout"] <- base::list(NULL) [15:31:52.296] } [15:31:52.296] base::close(...future.stdout) [15:31:52.296] ...future.stdout <- NULL [15:31:52.296] } [15:31:52.296] ...future.result$conditions <- ...future.conditions [15:31:52.296] ...future.result$finished <- base::Sys.time() [15:31:52.296] ...future.result [15:31:52.296] } [15:31:52.300] assign_globals() ... [15:31:52.300] List of 5 [15:31:52.300] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:52.300] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:52.300] $ future.call.arguments :List of 2 [15:31:52.300] ..$ collapse: chr "; " [15:31:52.300] ..$ maxHead : int 3 [15:31:52.300] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.300] $ ...future.elements_ii :List of 1 [15:31:52.300] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [15:31:52.300] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [15:31:52.300] $ ...future.seeds_ii : NULL [15:31:52.300] $ ...future.globals.maxSize: NULL [15:31:52.300] - attr(*, "where")=List of 5 [15:31:52.300] ..$ ...future.FUN : [15:31:52.300] ..$ future.call.arguments : [15:31:52.300] ..$ ...future.elements_ii : [15:31:52.300] ..$ ...future.seeds_ii : [15:31:52.300] ..$ ...future.globals.maxSize: [15:31:52.300] - attr(*, "resolved")= logi FALSE [15:31:52.300] - attr(*, "total_size")= num 71456 [15:31:52.300] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.300] - attr(*, "already-done")= logi TRUE [15:31:52.308] - copied '...future.FUN' to environment [15:31:52.308] - copied 'future.call.arguments' to environment [15:31:52.308] - copied '...future.elements_ii' to environment [15:31:52.308] - copied '...future.seeds_ii' to environment [15:31:52.309] - copied '...future.globals.maxSize' to environment [15:31:52.309] assign_globals() ... done [15:31:52.309] plan(): Setting new future strategy stack: [15:31:52.310] List of future strategies: [15:31:52.310] 1. sequential: [15:31:52.310] - args: function (..., envir = parent.frame(), workers = "") [15:31:52.310] - tweaked: FALSE [15:31:52.310] - call: NULL [15:31:52.310] plan(): nbrOfWorkers() = 1 [15:31:52.312] plan(): Setting new future strategy stack: [15:31:52.312] List of future strategies: [15:31:52.312] 1. sequential: [15:31:52.312] - args: function (..., envir = parent.frame(), workers = "") [15:31:52.312] - tweaked: FALSE [15:31:52.312] - call: plan(strategy) [15:31:52.313] plan(): nbrOfWorkers() = 1 [15:31:52.314] SequentialFuture started (and completed) [15:31:52.314] - Launch lazy future ... done [15:31:52.314] run() for 'SequentialFuture' ... done [15:31:52.315] Created future: [15:31:52.315] SequentialFuture: [15:31:52.315] Label: 'future_lapply-1' [15:31:52.315] Expression: [15:31:52.315] { [15:31:52.315] do.call(function(...) { [15:31:52.315] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.315] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:52.315] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.315] on.exit(options(oopts), add = TRUE) [15:31:52.315] } [15:31:52.315] { [15:31:52.315] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:52.315] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.315] ...future.FUN(...future.X_jj, ...) [15:31:52.315] }) [15:31:52.315] } [15:31:52.315] }, args = future.call.arguments) [15:31:52.315] } [15:31:52.315] Lazy evaluation: FALSE [15:31:52.315] Asynchronous evaluation: FALSE [15:31:52.315] Local evaluation: TRUE [15:31:52.315] Environment: R_GlobalEnv [15:31:52.315] Capture standard output: TRUE [15:31:52.315] Capture condition classes: 'condition' (excluding 'nothing') [15:31:52.315] Globals: 5 objects totaling 82.61 KiB (function '...future.FUN' of 69.62 KiB, DotDotDotList 'future.call.arguments' of 168 bytes, list '...future.elements_ii' of 12.83 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:52.315] Packages: 1 packages ('future') [15:31:52.315] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:52.315] Resolved: TRUE [15:31:52.315] Value: 136 bytes of class 'list' [15:31:52.315] Early signaling: FALSE [15:31:52.315] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:52.315] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:52.318] Chunk #1 of 1 ... DONE [15:31:52.318] Launching 1 futures (chunks) ... DONE [15:31:52.318] Resolving 1 futures (chunks) ... [15:31:52.319] resolve() on list ... [15:31:52.319] recursive: 0 [15:31:52.319] length: 1 [15:31:52.320] [15:31:52.320] resolved() for 'SequentialFuture' ... [15:31:52.320] - state: 'finished' [15:31:52.321] - run: TRUE [15:31:52.321] - result: 'FutureResult' [15:31:52.321] resolved() for 'SequentialFuture' ... done [15:31:52.322] Future #1 [15:31:52.322] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:52.322] - nx: 1 [15:31:52.323] - relay: TRUE [15:31:52.323] - stdout: TRUE [15:31:52.323] - signal: TRUE [15:31:52.324] - resignal: FALSE [15:31:52.324] - force: TRUE [15:31:52.324] - relayed: [n=1] FALSE [15:31:52.325] - queued futures: [n=1] FALSE [15:31:52.325] - until=1 [15:31:52.325] - relaying element #1 [15:31:52.326] - relayed: [n=1] TRUE [15:31:52.326] - queued futures: [n=1] TRUE [15:31:52.326] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:52.327] length: 0 (resolved future 1) [15:31:52.327] Relaying remaining futures [15:31:52.327] signalConditionsASAP(NULL, pos=0) ... [15:31:52.328] - nx: 1 [15:31:52.328] - relay: TRUE [15:31:52.328] - stdout: TRUE [15:31:52.329] - signal: TRUE [15:31:52.329] - resignal: FALSE [15:31:52.329] - force: TRUE [15:31:52.329] - relayed: [n=1] TRUE [15:31:52.330] - queued futures: [n=1] TRUE - flush all [15:31:52.330] - relayed: [n=1] TRUE [15:31:52.330] - queued futures: [n=1] TRUE [15:31:52.331] signalConditionsASAP(NULL, pos=0) ... done [15:31:52.331] resolve() on list ... DONE [15:31:52.332] - Number of value chunks collected: 1 [15:31:52.332] Resolving 1 futures (chunks) ... DONE [15:31:52.332] Reducing values from 1 chunks ... [15:31:52.332] - Number of values collected after concatenation: 1 [15:31:52.333] - Number of values expected: 1 [15:31:52.333] Reducing values from 1 chunks ... DONE [15:31:52.333] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [15:31:52.336] future_lapply() ... [15:31:52.338] Number of chunks: 2 [15:31:52.338] getGlobalsAndPackagesXApply() ... [15:31:52.338] - future.globals: TRUE [15:31:52.339] getGlobalsAndPackages() ... [15:31:52.339] Searching for globals... [15:31:52.342] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [15:31:52.342] Searching for globals ... DONE [15:31:52.342] Resolving globals: FALSE [15:31:52.343] The total size of the 1 globals is 4.85 KiB (4968 bytes) [15:31:52.344] The total size of the 1 globals exported for future expression ('FUN()') is 4.85 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (4.85 KiB of class 'function') [15:31:52.345] - globals: [1] 'FUN' [15:31:52.345] - packages: [1] 'listenv' [15:31:52.345] getGlobalsAndPackages() ... DONE [15:31:52.346] - globals found/used: [n=1] 'FUN' [15:31:52.346] - needed namespaces: [n=1] 'listenv' [15:31:52.346] Finding globals ... DONE [15:31:52.347] - use_args: TRUE [15:31:52.347] - Getting '...' globals ... [15:31:52.348] resolve() on list ... [15:31:52.348] recursive: 0 [15:31:52.348] length: 1 [15:31:52.349] elements: '...' [15:31:52.349] length: 0 (resolved future 1) [15:31:52.349] resolve() on list ... DONE [15:31:52.350] - '...' content: [n=0] [15:31:52.350] List of 1 [15:31:52.350] $ ...: list() [15:31:52.350] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.350] - attr(*, "where")=List of 1 [15:31:52.350] ..$ ...: [15:31:52.350] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.350] - attr(*, "resolved")= logi TRUE [15:31:52.350] - attr(*, "total_size")= num NA [15:31:52.356] - Getting '...' globals ... DONE [15:31:52.356] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:52.357] List of 2 [15:31:52.357] $ ...future.FUN:function (x, ...) [15:31:52.357] $ ... : list() [15:31:52.357] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.357] - attr(*, "where")=List of 2 [15:31:52.357] ..$ ...future.FUN: [15:31:52.357] ..$ ... : [15:31:52.357] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.357] - attr(*, "resolved")= logi FALSE [15:31:52.357] - attr(*, "total_size")= num 4968 [15:31:52.362] Packages to be attached in all futures: [n=1] 'listenv' [15:31:52.363] getGlobalsAndPackagesXApply() ... DONE [15:31:52.363] Number of futures (= number of chunks): 2 [15:31:52.363] Launching 2 futures (chunks) ... [15:31:52.364] Chunk #1 of 2 ... [15:31:52.364] - Finding globals in 'X' for chunk #1 ... [15:31:52.364] getGlobalsAndPackages() ... [15:31:52.364] Searching for globals... [15:31:52.365] [15:31:52.366] Searching for globals ... DONE [15:31:52.366] - globals: [0] [15:31:52.366] getGlobalsAndPackages() ... DONE [15:31:52.366] + additional globals found: [n=0] [15:31:52.367] + additional namespaces needed: [n=0] [15:31:52.367] - Finding globals in 'X' for chunk #1 ... DONE [15:31:52.367] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:52.367] - seeds: [15:31:52.368] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.368] getGlobalsAndPackages() ... [15:31:52.368] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.368] Resolving globals: FALSE [15:31:52.369] Tweak future expression to call with '...' arguments ... [15:31:52.369] { [15:31:52.369] do.call(function(...) { [15:31:52.369] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.369] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:52.369] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.369] on.exit(options(oopts), add = TRUE) [15:31:52.369] } [15:31:52.369] { [15:31:52.369] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:52.369] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.369] ...future.FUN(...future.X_jj, ...) [15:31:52.369] }) [15:31:52.369] } [15:31:52.369] }, args = future.call.arguments) [15:31:52.369] } [15:31:52.370] Tweak future expression to call with '...' arguments ... DONE [15:31:52.371] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.371] - packages: [1] 'listenv' [15:31:52.371] getGlobalsAndPackages() ... DONE [15:31:52.372] run() for 'Future' ... [15:31:52.372] - state: 'created' [15:31:52.372] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:52.373] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:52.373] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:52.373] - Field: 'label' [15:31:52.374] - Field: 'local' [15:31:52.374] - Field: 'owner' [15:31:52.374] - Field: 'envir' [15:31:52.375] - Field: 'packages' [15:31:52.375] - Field: 'gc' [15:31:52.375] - Field: 'conditions' [15:31:52.375] - Field: 'expr' [15:31:52.376] - Field: 'uuid' [15:31:52.376] - Field: 'seed' [15:31:52.376] - Field: 'version' [15:31:52.376] - Field: 'result' [15:31:52.377] - Field: 'asynchronous' [15:31:52.377] - Field: 'calls' [15:31:52.377] - Field: 'globals' [15:31:52.377] - Field: 'stdout' [15:31:52.378] - Field: 'earlySignal' [15:31:52.378] - Field: 'lazy' [15:31:52.378] - Field: 'state' [15:31:52.379] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:52.379] - Launch lazy future ... [15:31:52.379] Packages needed by the future expression (n = 1): 'listenv' [15:31:52.379] Packages needed by future strategies (n = 0): [15:31:52.380] { [15:31:52.380] { [15:31:52.380] { [15:31:52.380] ...future.startTime <- base::Sys.time() [15:31:52.380] { [15:31:52.380] { [15:31:52.380] { [15:31:52.380] { [15:31:52.380] base::local({ [15:31:52.380] has_future <- base::requireNamespace("future", [15:31:52.380] quietly = TRUE) [15:31:52.380] if (has_future) { [15:31:52.380] ns <- base::getNamespace("future") [15:31:52.380] version <- ns[[".package"]][["version"]] [15:31:52.380] if (is.null(version)) [15:31:52.380] version <- utils::packageVersion("future") [15:31:52.380] } [15:31:52.380] else { [15:31:52.380] version <- NULL [15:31:52.380] } [15:31:52.380] if (!has_future || version < "1.8.0") { [15:31:52.380] info <- base::c(r_version = base::gsub("R version ", [15:31:52.380] "", base::R.version$version.string), [15:31:52.380] platform = base::sprintf("%s (%s-bit)", [15:31:52.380] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:52.380] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:52.380] "release", "version")], collapse = " "), [15:31:52.380] hostname = base::Sys.info()[["nodename"]]) [15:31:52.380] info <- base::sprintf("%s: %s", base::names(info), [15:31:52.380] info) [15:31:52.380] info <- base::paste(info, collapse = "; ") [15:31:52.380] if (!has_future) { [15:31:52.380] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:52.380] info) [15:31:52.380] } [15:31:52.380] else { [15:31:52.380] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:52.380] info, version) [15:31:52.380] } [15:31:52.380] base::stop(msg) [15:31:52.380] } [15:31:52.380] }) [15:31:52.380] } [15:31:52.380] base::local({ [15:31:52.380] for (pkg in "listenv") { [15:31:52.380] base::loadNamespace(pkg) [15:31:52.380] base::library(pkg, character.only = TRUE) [15:31:52.380] } [15:31:52.380] }) [15:31:52.380] } [15:31:52.380] ...future.strategy.old <- future::plan("list") [15:31:52.380] options(future.plan = NULL) [15:31:52.380] Sys.unsetenv("R_FUTURE_PLAN") [15:31:52.380] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:52.380] } [15:31:52.380] ...future.workdir <- getwd() [15:31:52.380] } [15:31:52.380] ...future.oldOptions <- base::as.list(base::.Options) [15:31:52.380] ...future.oldEnvVars <- base::Sys.getenv() [15:31:52.380] } [15:31:52.380] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:52.380] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:52.380] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:52.380] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:52.380] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:52.380] future.stdout.windows.reencode = NULL, width = 80L) [15:31:52.380] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:52.380] base::names(...future.oldOptions)) [15:31:52.380] } [15:31:52.380] if (FALSE) { [15:31:52.380] } [15:31:52.380] else { [15:31:52.380] if (TRUE) { [15:31:52.380] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:52.380] open = "w") [15:31:52.380] } [15:31:52.380] else { [15:31:52.380] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:52.380] windows = "NUL", "/dev/null"), open = "w") [15:31:52.380] } [15:31:52.380] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:52.380] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:52.380] base::sink(type = "output", split = FALSE) [15:31:52.380] base::close(...future.stdout) [15:31:52.380] }, add = TRUE) [15:31:52.380] } [15:31:52.380] ...future.frame <- base::sys.nframe() [15:31:52.380] ...future.conditions <- base::list() [15:31:52.380] ...future.rng <- base::globalenv()$.Random.seed [15:31:52.380] if (FALSE) { [15:31:52.380] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:52.380] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:52.380] } [15:31:52.380] ...future.result <- base::tryCatch({ [15:31:52.380] base::withCallingHandlers({ [15:31:52.380] ...future.value <- base::withVisible(base::local({ [15:31:52.380] do.call(function(...) { [15:31:52.380] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.380] if (!identical(...future.globals.maxSize.org, [15:31:52.380] ...future.globals.maxSize)) { [15:31:52.380] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.380] on.exit(options(oopts), add = TRUE) [15:31:52.380] } [15:31:52.380] { [15:31:52.380] lapply(seq_along(...future.elements_ii), [15:31:52.380] FUN = function(jj) { [15:31:52.380] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.380] ...future.FUN(...future.X_jj, ...) [15:31:52.380] }) [15:31:52.380] } [15:31:52.380] }, args = future.call.arguments) [15:31:52.380] })) [15:31:52.380] future::FutureResult(value = ...future.value$value, [15:31:52.380] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:52.380] ...future.rng), globalenv = if (FALSE) [15:31:52.380] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:52.380] ...future.globalenv.names)) [15:31:52.380] else NULL, started = ...future.startTime, version = "1.8") [15:31:52.380] }, condition = base::local({ [15:31:52.380] c <- base::c [15:31:52.380] inherits <- base::inherits [15:31:52.380] invokeRestart <- base::invokeRestart [15:31:52.380] length <- base::length [15:31:52.380] list <- base::list [15:31:52.380] seq.int <- base::seq.int [15:31:52.380] signalCondition <- base::signalCondition [15:31:52.380] sys.calls <- base::sys.calls [15:31:52.380] `[[` <- base::`[[` [15:31:52.380] `+` <- base::`+` [15:31:52.380] `<<-` <- base::`<<-` [15:31:52.380] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:52.380] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:52.380] 3L)] [15:31:52.380] } [15:31:52.380] function(cond) { [15:31:52.380] is_error <- inherits(cond, "error") [15:31:52.380] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:52.380] NULL) [15:31:52.380] if (is_error) { [15:31:52.380] sessionInformation <- function() { [15:31:52.380] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:52.380] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:52.380] search = base::search(), system = base::Sys.info()) [15:31:52.380] } [15:31:52.380] ...future.conditions[[length(...future.conditions) + [15:31:52.380] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:52.380] cond$call), session = sessionInformation(), [15:31:52.380] timestamp = base::Sys.time(), signaled = 0L) [15:31:52.380] signalCondition(cond) [15:31:52.380] } [15:31:52.380] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:52.380] "immediateCondition"))) { [15:31:52.380] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:52.380] ...future.conditions[[length(...future.conditions) + [15:31:52.380] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:52.380] if (TRUE && !signal) { [15:31:52.380] muffleCondition <- function (cond, pattern = "^muffle") [15:31:52.380] { [15:31:52.380] inherits <- base::inherits [15:31:52.380] invokeRestart <- base::invokeRestart [15:31:52.380] is.null <- base::is.null [15:31:52.380] muffled <- FALSE [15:31:52.380] if (inherits(cond, "message")) { [15:31:52.380] muffled <- grepl(pattern, "muffleMessage") [15:31:52.380] if (muffled) [15:31:52.380] invokeRestart("muffleMessage") [15:31:52.380] } [15:31:52.380] else if (inherits(cond, "warning")) { [15:31:52.380] muffled <- grepl(pattern, "muffleWarning") [15:31:52.380] if (muffled) [15:31:52.380] invokeRestart("muffleWarning") [15:31:52.380] } [15:31:52.380] else if (inherits(cond, "condition")) { [15:31:52.380] if (!is.null(pattern)) { [15:31:52.380] computeRestarts <- base::computeRestarts [15:31:52.380] grepl <- base::grepl [15:31:52.380] restarts <- computeRestarts(cond) [15:31:52.380] for (restart in restarts) { [15:31:52.380] name <- restart$name [15:31:52.380] if (is.null(name)) [15:31:52.380] next [15:31:52.380] if (!grepl(pattern, name)) [15:31:52.380] next [15:31:52.380] invokeRestart(restart) [15:31:52.380] muffled <- TRUE [15:31:52.380] break [15:31:52.380] } [15:31:52.380] } [15:31:52.380] } [15:31:52.380] invisible(muffled) [15:31:52.380] } [15:31:52.380] muffleCondition(cond, pattern = "^muffle") [15:31:52.380] } [15:31:52.380] } [15:31:52.380] else { [15:31:52.380] if (TRUE) { [15:31:52.380] muffleCondition <- function (cond, pattern = "^muffle") [15:31:52.380] { [15:31:52.380] inherits <- base::inherits [15:31:52.380] invokeRestart <- base::invokeRestart [15:31:52.380] is.null <- base::is.null [15:31:52.380] muffled <- FALSE [15:31:52.380] if (inherits(cond, "message")) { [15:31:52.380] muffled <- grepl(pattern, "muffleMessage") [15:31:52.380] if (muffled) [15:31:52.380] invokeRestart("muffleMessage") [15:31:52.380] } [15:31:52.380] else if (inherits(cond, "warning")) { [15:31:52.380] muffled <- grepl(pattern, "muffleWarning") [15:31:52.380] if (muffled) [15:31:52.380] invokeRestart("muffleWarning") [15:31:52.380] } [15:31:52.380] else if (inherits(cond, "condition")) { [15:31:52.380] if (!is.null(pattern)) { [15:31:52.380] computeRestarts <- base::computeRestarts [15:31:52.380] grepl <- base::grepl [15:31:52.380] restarts <- computeRestarts(cond) [15:31:52.380] for (restart in restarts) { [15:31:52.380] name <- restart$name [15:31:52.380] if (is.null(name)) [15:31:52.380] next [15:31:52.380] if (!grepl(pattern, name)) [15:31:52.380] next [15:31:52.380] invokeRestart(restart) [15:31:52.380] muffled <- TRUE [15:31:52.380] break [15:31:52.380] } [15:31:52.380] } [15:31:52.380] } [15:31:52.380] invisible(muffled) [15:31:52.380] } [15:31:52.380] muffleCondition(cond, pattern = "^muffle") [15:31:52.380] } [15:31:52.380] } [15:31:52.380] } [15:31:52.380] })) [15:31:52.380] }, error = function(ex) { [15:31:52.380] base::structure(base::list(value = NULL, visible = NULL, [15:31:52.380] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:52.380] ...future.rng), started = ...future.startTime, [15:31:52.380] finished = Sys.time(), session_uuid = NA_character_, [15:31:52.380] version = "1.8"), class = "FutureResult") [15:31:52.380] }, finally = { [15:31:52.380] if (!identical(...future.workdir, getwd())) [15:31:52.380] setwd(...future.workdir) [15:31:52.380] { [15:31:52.380] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:52.380] ...future.oldOptions$nwarnings <- NULL [15:31:52.380] } [15:31:52.380] base::options(...future.oldOptions) [15:31:52.380] if (.Platform$OS.type == "windows") { [15:31:52.380] old_names <- names(...future.oldEnvVars) [15:31:52.380] envs <- base::Sys.getenv() [15:31:52.380] names <- names(envs) [15:31:52.380] common <- intersect(names, old_names) [15:31:52.380] added <- setdiff(names, old_names) [15:31:52.380] removed <- setdiff(old_names, names) [15:31:52.380] changed <- common[...future.oldEnvVars[common] != [15:31:52.380] envs[common]] [15:31:52.380] NAMES <- toupper(changed) [15:31:52.380] args <- list() [15:31:52.380] for (kk in seq_along(NAMES)) { [15:31:52.380] name <- changed[[kk]] [15:31:52.380] NAME <- NAMES[[kk]] [15:31:52.380] if (name != NAME && is.element(NAME, old_names)) [15:31:52.380] next [15:31:52.380] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:52.380] } [15:31:52.380] NAMES <- toupper(added) [15:31:52.380] for (kk in seq_along(NAMES)) { [15:31:52.380] name <- added[[kk]] [15:31:52.380] NAME <- NAMES[[kk]] [15:31:52.380] if (name != NAME && is.element(NAME, old_names)) [15:31:52.380] next [15:31:52.380] args[[name]] <- "" [15:31:52.380] } [15:31:52.380] NAMES <- toupper(removed) [15:31:52.380] for (kk in seq_along(NAMES)) { [15:31:52.380] name <- removed[[kk]] [15:31:52.380] NAME <- NAMES[[kk]] [15:31:52.380] if (name != NAME && is.element(NAME, old_names)) [15:31:52.380] next [15:31:52.380] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:52.380] } [15:31:52.380] if (length(args) > 0) [15:31:52.380] base::do.call(base::Sys.setenv, args = args) [15:31:52.380] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:52.380] } [15:31:52.380] else { [15:31:52.380] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:52.380] } [15:31:52.380] { [15:31:52.380] if (base::length(...future.futureOptionsAdded) > [15:31:52.380] 0L) { [15:31:52.380] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:52.380] base::names(opts) <- ...future.futureOptionsAdded [15:31:52.380] base::options(opts) [15:31:52.380] } [15:31:52.380] { [15:31:52.380] { [15:31:52.380] NULL [15:31:52.380] RNGkind("Mersenne-Twister") [15:31:52.380] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:52.380] inherits = FALSE) [15:31:52.380] } [15:31:52.380] options(future.plan = NULL) [15:31:52.380] if (is.na(NA_character_)) [15:31:52.380] Sys.unsetenv("R_FUTURE_PLAN") [15:31:52.380] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:52.380] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:52.380] .init = FALSE) [15:31:52.380] } [15:31:52.380] } [15:31:52.380] } [15:31:52.380] }) [15:31:52.380] if (TRUE) { [15:31:52.380] base::sink(type = "output", split = FALSE) [15:31:52.380] if (TRUE) { [15:31:52.380] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:52.380] } [15:31:52.380] else { [15:31:52.380] ...future.result["stdout"] <- base::list(NULL) [15:31:52.380] } [15:31:52.380] base::close(...future.stdout) [15:31:52.380] ...future.stdout <- NULL [15:31:52.380] } [15:31:52.380] ...future.result$conditions <- ...future.conditions [15:31:52.380] ...future.result$finished <- base::Sys.time() [15:31:52.380] ...future.result [15:31:52.380] } [15:31:52.386] assign_globals() ... [15:31:52.386] List of 5 [15:31:52.386] $ ...future.FUN :function (x, ...) [15:31:52.386] $ future.call.arguments : list() [15:31:52.386] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.386] $ ...future.elements_ii :List of 1 [15:31:52.386] ..$ a:Classes 'listenv', 'environment' [15:31:52.386] $ ...future.seeds_ii : NULL [15:31:52.386] $ ...future.globals.maxSize: NULL [15:31:52.386] - attr(*, "where")=List of 5 [15:31:52.386] ..$ ...future.FUN : [15:31:52.386] ..$ future.call.arguments : [15:31:52.386] ..$ ...future.elements_ii : [15:31:52.386] ..$ ...future.seeds_ii : [15:31:52.386] ..$ ...future.globals.maxSize: [15:31:52.386] - attr(*, "resolved")= logi FALSE [15:31:52.386] - attr(*, "total_size")= num 4968 [15:31:52.386] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.386] - attr(*, "already-done")= logi TRUE [15:31:52.396] - copied '...future.FUN' to environment [15:31:52.396] - copied 'future.call.arguments' to environment [15:31:52.396] - copied '...future.elements_ii' to environment [15:31:52.397] - copied '...future.seeds_ii' to environment [15:31:52.397] - copied '...future.globals.maxSize' to environment [15:31:52.398] assign_globals() ... done [15:31:52.403] plan(): Setting new future strategy stack: [15:31:52.403] List of future strategies: [15:31:52.403] 1. sequential: [15:31:52.403] - args: function (..., envir = parent.frame(), workers = "") [15:31:52.403] - tweaked: FALSE [15:31:52.403] - call: NULL [15:31:52.404] plan(): nbrOfWorkers() = 1 [15:31:52.406] plan(): Setting new future strategy stack: [15:31:52.407] List of future strategies: [15:31:52.407] 1. sequential: [15:31:52.407] - args: function (..., envir = parent.frame(), workers = "") [15:31:52.407] - tweaked: FALSE [15:31:52.407] - call: plan(strategy) [15:31:52.408] plan(): nbrOfWorkers() = 1 [15:31:52.408] SequentialFuture started (and completed) [15:31:52.408] - Launch lazy future ... done [15:31:52.409] run() for 'SequentialFuture' ... done [15:31:52.409] Created future: [15:31:52.409] SequentialFuture: [15:31:52.409] Label: 'future_lapply-1' [15:31:52.409] Expression: [15:31:52.409] { [15:31:52.409] do.call(function(...) { [15:31:52.409] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.409] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:52.409] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.409] on.exit(options(oopts), add = TRUE) [15:31:52.409] } [15:31:52.409] { [15:31:52.409] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:52.409] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.409] ...future.FUN(...future.X_jj, ...) [15:31:52.409] }) [15:31:52.409] } [15:31:52.409] }, args = future.call.arguments) [15:31:52.409] } [15:31:52.409] Lazy evaluation: FALSE [15:31:52.409] Asynchronous evaluation: FALSE [15:31:52.409] Local evaluation: TRUE [15:31:52.409] Environment: R_GlobalEnv [15:31:52.409] Capture standard output: TRUE [15:31:52.409] Capture condition classes: 'condition' (excluding 'nothing') [15:31:52.409] Globals: 5 objects totaling 4.96 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:52.409] Packages: 1 packages ('listenv') [15:31:52.409] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:52.409] Resolved: TRUE [15:31:52.409] Value: 336 bytes of class 'list' [15:31:52.409] Early signaling: FALSE [15:31:52.409] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:52.409] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:52.412] Chunk #1 of 2 ... DONE [15:31:52.412] Chunk #2 of 2 ... [15:31:52.412] - Finding globals in 'X' for chunk #2 ... [15:31:52.413] getGlobalsAndPackages() ... [15:31:52.413] Searching for globals... [15:31:52.414] [15:31:52.414] Searching for globals ... DONE [15:31:52.414] - globals: [0] [15:31:52.414] getGlobalsAndPackages() ... DONE [15:31:52.415] + additional globals found: [n=0] [15:31:52.415] + additional namespaces needed: [n=0] [15:31:52.415] - Finding globals in 'X' for chunk #2 ... DONE [15:31:52.415] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:52.416] - seeds: [15:31:52.416] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.416] getGlobalsAndPackages() ... [15:31:52.416] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.417] Resolving globals: FALSE [15:31:52.417] Tweak future expression to call with '...' arguments ... [15:31:52.417] { [15:31:52.417] do.call(function(...) { [15:31:52.417] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.417] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:52.417] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.417] on.exit(options(oopts), add = TRUE) [15:31:52.417] } [15:31:52.417] { [15:31:52.417] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:52.417] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.417] ...future.FUN(...future.X_jj, ...) [15:31:52.417] }) [15:31:52.417] } [15:31:52.417] }, args = future.call.arguments) [15:31:52.417] } [15:31:52.418] Tweak future expression to call with '...' arguments ... DONE [15:31:52.419] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.419] - packages: [1] 'listenv' [15:31:52.420] getGlobalsAndPackages() ... DONE [15:31:52.420] run() for 'Future' ... [15:31:52.421] - state: 'created' [15:31:52.421] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:52.422] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:52.422] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:52.422] - Field: 'label' [15:31:52.422] - Field: 'local' [15:31:52.423] - Field: 'owner' [15:31:52.423] - Field: 'envir' [15:31:52.423] - Field: 'packages' [15:31:52.423] - Field: 'gc' [15:31:52.424] - Field: 'conditions' [15:31:52.424] - Field: 'expr' [15:31:52.424] - Field: 'uuid' [15:31:52.425] - Field: 'seed' [15:31:52.425] - Field: 'version' [15:31:52.425] - Field: 'result' [15:31:52.426] - Field: 'asynchronous' [15:31:52.426] - Field: 'calls' [15:31:52.426] - Field: 'globals' [15:31:52.426] - Field: 'stdout' [15:31:52.427] - Field: 'earlySignal' [15:31:52.427] - Field: 'lazy' [15:31:52.427] - Field: 'state' [15:31:52.427] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:52.428] - Launch lazy future ... [15:31:52.428] Packages needed by the future expression (n = 1): 'listenv' [15:31:52.428] Packages needed by future strategies (n = 0): [15:31:52.430] { [15:31:52.430] { [15:31:52.430] { [15:31:52.430] ...future.startTime <- base::Sys.time() [15:31:52.430] { [15:31:52.430] { [15:31:52.430] { [15:31:52.430] { [15:31:52.430] base::local({ [15:31:52.430] has_future <- base::requireNamespace("future", [15:31:52.430] quietly = TRUE) [15:31:52.430] if (has_future) { [15:31:52.430] ns <- base::getNamespace("future") [15:31:52.430] version <- ns[[".package"]][["version"]] [15:31:52.430] if (is.null(version)) [15:31:52.430] version <- utils::packageVersion("future") [15:31:52.430] } [15:31:52.430] else { [15:31:52.430] version <- NULL [15:31:52.430] } [15:31:52.430] if (!has_future || version < "1.8.0") { [15:31:52.430] info <- base::c(r_version = base::gsub("R version ", [15:31:52.430] "", base::R.version$version.string), [15:31:52.430] platform = base::sprintf("%s (%s-bit)", [15:31:52.430] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:52.430] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:52.430] "release", "version")], collapse = " "), [15:31:52.430] hostname = base::Sys.info()[["nodename"]]) [15:31:52.430] info <- base::sprintf("%s: %s", base::names(info), [15:31:52.430] info) [15:31:52.430] info <- base::paste(info, collapse = "; ") [15:31:52.430] if (!has_future) { [15:31:52.430] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:52.430] info) [15:31:52.430] } [15:31:52.430] else { [15:31:52.430] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:52.430] info, version) [15:31:52.430] } [15:31:52.430] base::stop(msg) [15:31:52.430] } [15:31:52.430] }) [15:31:52.430] } [15:31:52.430] base::local({ [15:31:52.430] for (pkg in "listenv") { [15:31:52.430] base::loadNamespace(pkg) [15:31:52.430] base::library(pkg, character.only = TRUE) [15:31:52.430] } [15:31:52.430] }) [15:31:52.430] } [15:31:52.430] ...future.strategy.old <- future::plan("list") [15:31:52.430] options(future.plan = NULL) [15:31:52.430] Sys.unsetenv("R_FUTURE_PLAN") [15:31:52.430] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:52.430] } [15:31:52.430] ...future.workdir <- getwd() [15:31:52.430] } [15:31:52.430] ...future.oldOptions <- base::as.list(base::.Options) [15:31:52.430] ...future.oldEnvVars <- base::Sys.getenv() [15:31:52.430] } [15:31:52.430] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:52.430] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:52.430] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:52.430] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:52.430] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:52.430] future.stdout.windows.reencode = NULL, width = 80L) [15:31:52.430] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:52.430] base::names(...future.oldOptions)) [15:31:52.430] } [15:31:52.430] if (FALSE) { [15:31:52.430] } [15:31:52.430] else { [15:31:52.430] if (TRUE) { [15:31:52.430] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:52.430] open = "w") [15:31:52.430] } [15:31:52.430] else { [15:31:52.430] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:52.430] windows = "NUL", "/dev/null"), open = "w") [15:31:52.430] } [15:31:52.430] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:52.430] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:52.430] base::sink(type = "output", split = FALSE) [15:31:52.430] base::close(...future.stdout) [15:31:52.430] }, add = TRUE) [15:31:52.430] } [15:31:52.430] ...future.frame <- base::sys.nframe() [15:31:52.430] ...future.conditions <- base::list() [15:31:52.430] ...future.rng <- base::globalenv()$.Random.seed [15:31:52.430] if (FALSE) { [15:31:52.430] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:52.430] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:52.430] } [15:31:52.430] ...future.result <- base::tryCatch({ [15:31:52.430] base::withCallingHandlers({ [15:31:52.430] ...future.value <- base::withVisible(base::local({ [15:31:52.430] do.call(function(...) { [15:31:52.430] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.430] if (!identical(...future.globals.maxSize.org, [15:31:52.430] ...future.globals.maxSize)) { [15:31:52.430] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.430] on.exit(options(oopts), add = TRUE) [15:31:52.430] } [15:31:52.430] { [15:31:52.430] lapply(seq_along(...future.elements_ii), [15:31:52.430] FUN = function(jj) { [15:31:52.430] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.430] ...future.FUN(...future.X_jj, ...) [15:31:52.430] }) [15:31:52.430] } [15:31:52.430] }, args = future.call.arguments) [15:31:52.430] })) [15:31:52.430] future::FutureResult(value = ...future.value$value, [15:31:52.430] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:52.430] ...future.rng), globalenv = if (FALSE) [15:31:52.430] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:52.430] ...future.globalenv.names)) [15:31:52.430] else NULL, started = ...future.startTime, version = "1.8") [15:31:52.430] }, condition = base::local({ [15:31:52.430] c <- base::c [15:31:52.430] inherits <- base::inherits [15:31:52.430] invokeRestart <- base::invokeRestart [15:31:52.430] length <- base::length [15:31:52.430] list <- base::list [15:31:52.430] seq.int <- base::seq.int [15:31:52.430] signalCondition <- base::signalCondition [15:31:52.430] sys.calls <- base::sys.calls [15:31:52.430] `[[` <- base::`[[` [15:31:52.430] `+` <- base::`+` [15:31:52.430] `<<-` <- base::`<<-` [15:31:52.430] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:52.430] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:52.430] 3L)] [15:31:52.430] } [15:31:52.430] function(cond) { [15:31:52.430] is_error <- inherits(cond, "error") [15:31:52.430] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:52.430] NULL) [15:31:52.430] if (is_error) { [15:31:52.430] sessionInformation <- function() { [15:31:52.430] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:52.430] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:52.430] search = base::search(), system = base::Sys.info()) [15:31:52.430] } [15:31:52.430] ...future.conditions[[length(...future.conditions) + [15:31:52.430] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:52.430] cond$call), session = sessionInformation(), [15:31:52.430] timestamp = base::Sys.time(), signaled = 0L) [15:31:52.430] signalCondition(cond) [15:31:52.430] } [15:31:52.430] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:52.430] "immediateCondition"))) { [15:31:52.430] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:52.430] ...future.conditions[[length(...future.conditions) + [15:31:52.430] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:52.430] if (TRUE && !signal) { [15:31:52.430] muffleCondition <- function (cond, pattern = "^muffle") [15:31:52.430] { [15:31:52.430] inherits <- base::inherits [15:31:52.430] invokeRestart <- base::invokeRestart [15:31:52.430] is.null <- base::is.null [15:31:52.430] muffled <- FALSE [15:31:52.430] if (inherits(cond, "message")) { [15:31:52.430] muffled <- grepl(pattern, "muffleMessage") [15:31:52.430] if (muffled) [15:31:52.430] invokeRestart("muffleMessage") [15:31:52.430] } [15:31:52.430] else if (inherits(cond, "warning")) { [15:31:52.430] muffled <- grepl(pattern, "muffleWarning") [15:31:52.430] if (muffled) [15:31:52.430] invokeRestart("muffleWarning") [15:31:52.430] } [15:31:52.430] else if (inherits(cond, "condition")) { [15:31:52.430] if (!is.null(pattern)) { [15:31:52.430] computeRestarts <- base::computeRestarts [15:31:52.430] grepl <- base::grepl [15:31:52.430] restarts <- computeRestarts(cond) [15:31:52.430] for (restart in restarts) { [15:31:52.430] name <- restart$name [15:31:52.430] if (is.null(name)) [15:31:52.430] next [15:31:52.430] if (!grepl(pattern, name)) [15:31:52.430] next [15:31:52.430] invokeRestart(restart) [15:31:52.430] muffled <- TRUE [15:31:52.430] break [15:31:52.430] } [15:31:52.430] } [15:31:52.430] } [15:31:52.430] invisible(muffled) [15:31:52.430] } [15:31:52.430] muffleCondition(cond, pattern = "^muffle") [15:31:52.430] } [15:31:52.430] } [15:31:52.430] else { [15:31:52.430] if (TRUE) { [15:31:52.430] muffleCondition <- function (cond, pattern = "^muffle") [15:31:52.430] { [15:31:52.430] inherits <- base::inherits [15:31:52.430] invokeRestart <- base::invokeRestart [15:31:52.430] is.null <- base::is.null [15:31:52.430] muffled <- FALSE [15:31:52.430] if (inherits(cond, "message")) { [15:31:52.430] muffled <- grepl(pattern, "muffleMessage") [15:31:52.430] if (muffled) [15:31:52.430] invokeRestart("muffleMessage") [15:31:52.430] } [15:31:52.430] else if (inherits(cond, "warning")) { [15:31:52.430] muffled <- grepl(pattern, "muffleWarning") [15:31:52.430] if (muffled) [15:31:52.430] invokeRestart("muffleWarning") [15:31:52.430] } [15:31:52.430] else if (inherits(cond, "condition")) { [15:31:52.430] if (!is.null(pattern)) { [15:31:52.430] computeRestarts <- base::computeRestarts [15:31:52.430] grepl <- base::grepl [15:31:52.430] restarts <- computeRestarts(cond) [15:31:52.430] for (restart in restarts) { [15:31:52.430] name <- restart$name [15:31:52.430] if (is.null(name)) [15:31:52.430] next [15:31:52.430] if (!grepl(pattern, name)) [15:31:52.430] next [15:31:52.430] invokeRestart(restart) [15:31:52.430] muffled <- TRUE [15:31:52.430] break [15:31:52.430] } [15:31:52.430] } [15:31:52.430] } [15:31:52.430] invisible(muffled) [15:31:52.430] } [15:31:52.430] muffleCondition(cond, pattern = "^muffle") [15:31:52.430] } [15:31:52.430] } [15:31:52.430] } [15:31:52.430] })) [15:31:52.430] }, error = function(ex) { [15:31:52.430] base::structure(base::list(value = NULL, visible = NULL, [15:31:52.430] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:52.430] ...future.rng), started = ...future.startTime, [15:31:52.430] finished = Sys.time(), session_uuid = NA_character_, [15:31:52.430] version = "1.8"), class = "FutureResult") [15:31:52.430] }, finally = { [15:31:52.430] if (!identical(...future.workdir, getwd())) [15:31:52.430] setwd(...future.workdir) [15:31:52.430] { [15:31:52.430] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:52.430] ...future.oldOptions$nwarnings <- NULL [15:31:52.430] } [15:31:52.430] base::options(...future.oldOptions) [15:31:52.430] if (.Platform$OS.type == "windows") { [15:31:52.430] old_names <- names(...future.oldEnvVars) [15:31:52.430] envs <- base::Sys.getenv() [15:31:52.430] names <- names(envs) [15:31:52.430] common <- intersect(names, old_names) [15:31:52.430] added <- setdiff(names, old_names) [15:31:52.430] removed <- setdiff(old_names, names) [15:31:52.430] changed <- common[...future.oldEnvVars[common] != [15:31:52.430] envs[common]] [15:31:52.430] NAMES <- toupper(changed) [15:31:52.430] args <- list() [15:31:52.430] for (kk in seq_along(NAMES)) { [15:31:52.430] name <- changed[[kk]] [15:31:52.430] NAME <- NAMES[[kk]] [15:31:52.430] if (name != NAME && is.element(NAME, old_names)) [15:31:52.430] next [15:31:52.430] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:52.430] } [15:31:52.430] NAMES <- toupper(added) [15:31:52.430] for (kk in seq_along(NAMES)) { [15:31:52.430] name <- added[[kk]] [15:31:52.430] NAME <- NAMES[[kk]] [15:31:52.430] if (name != NAME && is.element(NAME, old_names)) [15:31:52.430] next [15:31:52.430] args[[name]] <- "" [15:31:52.430] } [15:31:52.430] NAMES <- toupper(removed) [15:31:52.430] for (kk in seq_along(NAMES)) { [15:31:52.430] name <- removed[[kk]] [15:31:52.430] NAME <- NAMES[[kk]] [15:31:52.430] if (name != NAME && is.element(NAME, old_names)) [15:31:52.430] next [15:31:52.430] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:52.430] } [15:31:52.430] if (length(args) > 0) [15:31:52.430] base::do.call(base::Sys.setenv, args = args) [15:31:52.430] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:52.430] } [15:31:52.430] else { [15:31:52.430] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:52.430] } [15:31:52.430] { [15:31:52.430] if (base::length(...future.futureOptionsAdded) > [15:31:52.430] 0L) { [15:31:52.430] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:52.430] base::names(opts) <- ...future.futureOptionsAdded [15:31:52.430] base::options(opts) [15:31:52.430] } [15:31:52.430] { [15:31:52.430] { [15:31:52.430] NULL [15:31:52.430] RNGkind("Mersenne-Twister") [15:31:52.430] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:52.430] inherits = FALSE) [15:31:52.430] } [15:31:52.430] options(future.plan = NULL) [15:31:52.430] if (is.na(NA_character_)) [15:31:52.430] Sys.unsetenv("R_FUTURE_PLAN") [15:31:52.430] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:52.430] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:52.430] .init = FALSE) [15:31:52.430] } [15:31:52.430] } [15:31:52.430] } [15:31:52.430] }) [15:31:52.430] if (TRUE) { [15:31:52.430] base::sink(type = "output", split = FALSE) [15:31:52.430] if (TRUE) { [15:31:52.430] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:52.430] } [15:31:52.430] else { [15:31:52.430] ...future.result["stdout"] <- base::list(NULL) [15:31:52.430] } [15:31:52.430] base::close(...future.stdout) [15:31:52.430] ...future.stdout <- NULL [15:31:52.430] } [15:31:52.430] ...future.result$conditions <- ...future.conditions [15:31:52.430] ...future.result$finished <- base::Sys.time() [15:31:52.430] ...future.result [15:31:52.430] } [15:31:52.436] assign_globals() ... [15:31:52.436] List of 5 [15:31:52.436] $ ...future.FUN :function (x, ...) [15:31:52.436] $ future.call.arguments : list() [15:31:52.436] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.436] $ ...future.elements_ii :List of 1 [15:31:52.436] ..$ b:Classes 'listenv', 'environment' [15:31:52.436] $ ...future.seeds_ii : NULL [15:31:52.436] $ ...future.globals.maxSize: NULL [15:31:52.436] - attr(*, "where")=List of 5 [15:31:52.436] ..$ ...future.FUN : [15:31:52.436] ..$ future.call.arguments : [15:31:52.436] ..$ ...future.elements_ii : [15:31:52.436] ..$ ...future.seeds_ii : [15:31:52.436] ..$ ...future.globals.maxSize: [15:31:52.436] - attr(*, "resolved")= logi FALSE [15:31:52.436] - attr(*, "total_size")= num 4968 [15:31:52.436] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.436] - attr(*, "already-done")= logi TRUE [15:31:52.444] - copied '...future.FUN' to environment [15:31:52.444] - copied 'future.call.arguments' to environment [15:31:52.445] - copied '...future.elements_ii' to environment [15:31:52.445] - copied '...future.seeds_ii' to environment [15:31:52.445] - copied '...future.globals.maxSize' to environment [15:31:52.445] assign_globals() ... done [15:31:52.446] plan(): Setting new future strategy stack: [15:31:52.447] List of future strategies: [15:31:52.447] 1. sequential: [15:31:52.447] - args: function (..., envir = parent.frame(), workers = "") [15:31:52.447] - tweaked: FALSE [15:31:52.447] - call: NULL [15:31:52.447] plan(): nbrOfWorkers() = 1 [15:31:52.449] plan(): Setting new future strategy stack: [15:31:52.450] List of future strategies: [15:31:52.450] 1. sequential: [15:31:52.450] - args: function (..., envir = parent.frame(), workers = "") [15:31:52.450] - tweaked: FALSE [15:31:52.450] - call: plan(strategy) [15:31:52.451] plan(): nbrOfWorkers() = 1 [15:31:52.451] SequentialFuture started (and completed) [15:31:52.451] - Launch lazy future ... done [15:31:52.452] run() for 'SequentialFuture' ... done [15:31:52.452] Created future: [15:31:52.452] SequentialFuture: [15:31:52.452] Label: 'future_lapply-2' [15:31:52.452] Expression: [15:31:52.452] { [15:31:52.452] do.call(function(...) { [15:31:52.452] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.452] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:52.452] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.452] on.exit(options(oopts), add = TRUE) [15:31:52.452] } [15:31:52.452] { [15:31:52.452] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:52.452] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.452] ...future.FUN(...future.X_jj, ...) [15:31:52.452] }) [15:31:52.452] } [15:31:52.452] }, args = future.call.arguments) [15:31:52.452] } [15:31:52.452] Lazy evaluation: FALSE [15:31:52.452] Asynchronous evaluation: FALSE [15:31:52.452] Local evaluation: TRUE [15:31:52.452] Environment: R_GlobalEnv [15:31:52.452] Capture standard output: TRUE [15:31:52.452] Capture condition classes: 'condition' (excluding 'nothing') [15:31:52.452] Globals: 5 objects totaling 17.79 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 12.94 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:52.452] Packages: 1 packages ('listenv') [15:31:52.452] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:52.452] Resolved: TRUE [15:31:52.452] Value: 464 bytes of class 'list' [15:31:52.452] Early signaling: FALSE [15:31:52.452] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:52.452] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:52.454] Chunk #2 of 2 ... DONE [15:31:52.454] Launching 2 futures (chunks) ... DONE [15:31:52.455] Resolving 2 futures (chunks) ... [15:31:52.455] resolve() on list ... [15:31:52.455] recursive: 0 [15:31:52.455] length: 2 [15:31:52.456] [15:31:52.456] resolved() for 'SequentialFuture' ... [15:31:52.456] - state: 'finished' [15:31:52.456] - run: TRUE [15:31:52.457] - result: 'FutureResult' [15:31:52.457] resolved() for 'SequentialFuture' ... done [15:31:52.457] Future #1 [15:31:52.458] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:52.458] - nx: 2 [15:31:52.458] - relay: TRUE [15:31:52.458] - stdout: TRUE [15:31:52.458] - signal: TRUE [15:31:52.459] - resignal: FALSE [15:31:52.459] - force: TRUE [15:31:52.459] - relayed: [n=2] FALSE, FALSE [15:31:52.459] - queued futures: [n=2] FALSE, FALSE [15:31:52.460] - until=1 [15:31:52.460] - relaying element #1 [15:31:52.460] - relayed: [n=2] TRUE, FALSE [15:31:52.460] - queued futures: [n=2] TRUE, FALSE [15:31:52.461] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:52.461] length: 1 (resolved future 1) [15:31:52.461] resolved() for 'SequentialFuture' ... [15:31:52.461] - state: 'finished' [15:31:52.462] - run: TRUE [15:31:52.462] - result: 'FutureResult' [15:31:52.462] resolved() for 'SequentialFuture' ... done [15:31:52.462] Future #2 [15:31:52.463] signalConditionsASAP(SequentialFuture, pos=2) ... [15:31:52.463] - nx: 2 [15:31:52.463] - relay: TRUE [15:31:52.463] - stdout: TRUE [15:31:52.464] - signal: TRUE [15:31:52.464] - resignal: FALSE [15:31:52.464] - force: TRUE [15:31:52.464] - relayed: [n=2] TRUE, FALSE [15:31:52.465] - queued futures: [n=2] TRUE, FALSE [15:31:52.465] - until=2 [15:31:52.465] - relaying element #2 [15:31:52.465] - relayed: [n=2] TRUE, TRUE [15:31:52.466] - queued futures: [n=2] TRUE, TRUE [15:31:52.466] signalConditionsASAP(SequentialFuture, pos=2) ... done [15:31:52.466] length: 0 (resolved future 2) [15:31:52.467] Relaying remaining futures [15:31:52.467] signalConditionsASAP(NULL, pos=0) ... [15:31:52.467] - nx: 2 [15:31:52.467] - relay: TRUE [15:31:52.467] - stdout: TRUE [15:31:52.468] - signal: TRUE [15:31:52.468] - resignal: FALSE [15:31:52.468] - force: TRUE [15:31:52.468] - relayed: [n=2] TRUE, TRUE [15:31:52.469] - queued futures: [n=2] TRUE, TRUE - flush all [15:31:52.469] - relayed: [n=2] TRUE, TRUE [15:31:52.469] - queued futures: [n=2] TRUE, TRUE [15:31:52.469] signalConditionsASAP(NULL, pos=0) ... done [15:31:52.470] resolve() on list ... DONE [15:31:52.470] - Number of value chunks collected: 2 [15:31:52.470] Resolving 2 futures (chunks) ... DONE [15:31:52.471] Reducing values from 2 chunks ... [15:31:52.471] - Number of values collected after concatenation: 2 [15:31:52.471] - Number of values expected: 2 [15:31:52.471] Reducing values from 2 chunks ... DONE [15:31:52.471] 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, ...) ... [15:31:52.475] future_lapply() ... [15:31:52.476] Number of chunks: 1 [15:31:52.476] getGlobalsAndPackagesXApply() ... [15:31:52.476] - future.globals: TRUE [15:31:52.477] getGlobalsAndPackages() ... [15:31:52.477] Searching for globals... [15:31:52.479] - globals found: [2] 'FUN', '.Internal' [15:31:52.479] Searching for globals ... DONE [15:31:52.479] Resolving globals: FALSE [15:31:52.480] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:52.480] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:52.480] - globals: [1] 'FUN' [15:31:52.481] [15:31:52.481] getGlobalsAndPackages() ... DONE [15:31:52.481] - globals found/used: [n=1] 'FUN' [15:31:52.481] - needed namespaces: [n=0] [15:31:52.481] Finding globals ... DONE [15:31:52.481] - use_args: TRUE [15:31:52.482] - Getting '...' globals ... [15:31:52.482] resolve() on list ... [15:31:52.482] recursive: 0 [15:31:52.482] length: 1 [15:31:52.482] elements: '...' [15:31:52.483] length: 0 (resolved future 1) [15:31:52.483] resolve() on list ... DONE [15:31:52.483] - '...' content: [n=1] 'length' [15:31:52.483] List of 1 [15:31:52.483] $ ...:List of 1 [15:31:52.483] ..$ length: int 2 [15:31:52.483] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.483] - attr(*, "where")=List of 1 [15:31:52.483] ..$ ...: [15:31:52.483] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.483] - attr(*, "resolved")= logi TRUE [15:31:52.483] - attr(*, "total_size")= num NA [15:31:52.488] - Getting '...' globals ... DONE [15:31:52.489] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:52.489] List of 2 [15:31:52.489] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:52.489] $ ... :List of 1 [15:31:52.489] ..$ length: int 2 [15:31:52.489] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.489] - attr(*, "where")=List of 2 [15:31:52.489] ..$ ...future.FUN: [15:31:52.489] ..$ ... : [15:31:52.489] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.489] - attr(*, "resolved")= logi FALSE [15:31:52.489] - attr(*, "total_size")= num 2240 [15:31:52.495] Packages to be attached in all futures: [n=0] [15:31:52.495] getGlobalsAndPackagesXApply() ... DONE [15:31:52.495] Number of futures (= number of chunks): 1 [15:31:52.496] Launching 1 futures (chunks) ... [15:31:52.496] Chunk #1 of 1 ... [15:31:52.496] - Finding globals in 'X' for chunk #1 ... [15:31:52.497] getGlobalsAndPackages() ... [15:31:52.497] Searching for globals... [15:31:52.498] [15:31:52.498] Searching for globals ... DONE [15:31:52.498] - globals: [0] [15:31:52.499] getGlobalsAndPackages() ... DONE [15:31:52.499] + additional globals found: [n=0] [15:31:52.499] + additional namespaces needed: [n=0] [15:31:52.499] - Finding globals in 'X' for chunk #1 ... DONE [15:31:52.500] - seeds: [15:31:52.500] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.500] getGlobalsAndPackages() ... [15:31:52.500] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.501] Resolving globals: FALSE [15:31:52.501] Tweak future expression to call with '...' arguments ... [15:31:52.501] { [15:31:52.501] do.call(function(...) { [15:31:52.501] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.501] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:52.501] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.501] on.exit(options(oopts), add = TRUE) [15:31:52.501] } [15:31:52.501] { [15:31:52.501] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:52.501] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.501] ...future.FUN(...future.X_jj, ...) [15:31:52.501] }) [15:31:52.501] } [15:31:52.501] }, args = future.call.arguments) [15:31:52.501] } [15:31:52.502] Tweak future expression to call with '...' arguments ... DONE [15:31:52.503] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.504] [15:31:52.504] getGlobalsAndPackages() ... DONE [15:31:52.504] run() for 'Future' ... [15:31:52.505] - state: 'created' [15:31:52.505] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:52.506] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:52.506] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:52.507] - Field: 'label' [15:31:52.507] - Field: 'local' [15:31:52.507] - Field: 'owner' [15:31:52.508] - Field: 'envir' [15:31:52.508] - Field: 'packages' [15:31:52.508] - Field: 'gc' [15:31:52.509] - Field: 'conditions' [15:31:52.509] - Field: 'expr' [15:31:52.509] - Field: 'uuid' [15:31:52.510] - Field: 'seed' [15:31:52.510] - Field: 'version' [15:31:52.510] - Field: 'result' [15:31:52.511] - Field: 'asynchronous' [15:31:52.511] - Field: 'calls' [15:31:52.511] - Field: 'globals' [15:31:52.512] - Field: 'stdout' [15:31:52.512] - Field: 'earlySignal' [15:31:52.512] - Field: 'lazy' [15:31:52.513] - Field: 'state' [15:31:52.513] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:52.513] - Launch lazy future ... [15:31:52.514] Packages needed by the future expression (n = 0): [15:31:52.514] Packages needed by future strategies (n = 0): [15:31:52.515] { [15:31:52.515] { [15:31:52.515] { [15:31:52.515] ...future.startTime <- base::Sys.time() [15:31:52.515] { [15:31:52.515] { [15:31:52.515] { [15:31:52.515] base::local({ [15:31:52.515] has_future <- base::requireNamespace("future", [15:31:52.515] quietly = TRUE) [15:31:52.515] if (has_future) { [15:31:52.515] ns <- base::getNamespace("future") [15:31:52.515] version <- ns[[".package"]][["version"]] [15:31:52.515] if (is.null(version)) [15:31:52.515] version <- utils::packageVersion("future") [15:31:52.515] } [15:31:52.515] else { [15:31:52.515] version <- NULL [15:31:52.515] } [15:31:52.515] if (!has_future || version < "1.8.0") { [15:31:52.515] info <- base::c(r_version = base::gsub("R version ", [15:31:52.515] "", base::R.version$version.string), [15:31:52.515] platform = base::sprintf("%s (%s-bit)", [15:31:52.515] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:52.515] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:52.515] "release", "version")], collapse = " "), [15:31:52.515] hostname = base::Sys.info()[["nodename"]]) [15:31:52.515] info <- base::sprintf("%s: %s", base::names(info), [15:31:52.515] info) [15:31:52.515] info <- base::paste(info, collapse = "; ") [15:31:52.515] if (!has_future) { [15:31:52.515] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:52.515] info) [15:31:52.515] } [15:31:52.515] else { [15:31:52.515] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:52.515] info, version) [15:31:52.515] } [15:31:52.515] base::stop(msg) [15:31:52.515] } [15:31:52.515] }) [15:31:52.515] } [15:31:52.515] ...future.strategy.old <- future::plan("list") [15:31:52.515] options(future.plan = NULL) [15:31:52.515] Sys.unsetenv("R_FUTURE_PLAN") [15:31:52.515] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:52.515] } [15:31:52.515] ...future.workdir <- getwd() [15:31:52.515] } [15:31:52.515] ...future.oldOptions <- base::as.list(base::.Options) [15:31:52.515] ...future.oldEnvVars <- base::Sys.getenv() [15:31:52.515] } [15:31:52.515] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:52.515] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:52.515] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:52.515] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:52.515] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:52.515] future.stdout.windows.reencode = NULL, width = 80L) [15:31:52.515] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:52.515] base::names(...future.oldOptions)) [15:31:52.515] } [15:31:52.515] if (FALSE) { [15:31:52.515] } [15:31:52.515] else { [15:31:52.515] if (TRUE) { [15:31:52.515] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:52.515] open = "w") [15:31:52.515] } [15:31:52.515] else { [15:31:52.515] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:52.515] windows = "NUL", "/dev/null"), open = "w") [15:31:52.515] } [15:31:52.515] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:52.515] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:52.515] base::sink(type = "output", split = FALSE) [15:31:52.515] base::close(...future.stdout) [15:31:52.515] }, add = TRUE) [15:31:52.515] } [15:31:52.515] ...future.frame <- base::sys.nframe() [15:31:52.515] ...future.conditions <- base::list() [15:31:52.515] ...future.rng <- base::globalenv()$.Random.seed [15:31:52.515] if (FALSE) { [15:31:52.515] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:52.515] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:52.515] } [15:31:52.515] ...future.result <- base::tryCatch({ [15:31:52.515] base::withCallingHandlers({ [15:31:52.515] ...future.value <- base::withVisible(base::local({ [15:31:52.515] do.call(function(...) { [15:31:52.515] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.515] if (!identical(...future.globals.maxSize.org, [15:31:52.515] ...future.globals.maxSize)) { [15:31:52.515] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.515] on.exit(options(oopts), add = TRUE) [15:31:52.515] } [15:31:52.515] { [15:31:52.515] lapply(seq_along(...future.elements_ii), [15:31:52.515] FUN = function(jj) { [15:31:52.515] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.515] ...future.FUN(...future.X_jj, ...) [15:31:52.515] }) [15:31:52.515] } [15:31:52.515] }, args = future.call.arguments) [15:31:52.515] })) [15:31:52.515] future::FutureResult(value = ...future.value$value, [15:31:52.515] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:52.515] ...future.rng), globalenv = if (FALSE) [15:31:52.515] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:52.515] ...future.globalenv.names)) [15:31:52.515] else NULL, started = ...future.startTime, version = "1.8") [15:31:52.515] }, condition = base::local({ [15:31:52.515] c <- base::c [15:31:52.515] inherits <- base::inherits [15:31:52.515] invokeRestart <- base::invokeRestart [15:31:52.515] length <- base::length [15:31:52.515] list <- base::list [15:31:52.515] seq.int <- base::seq.int [15:31:52.515] signalCondition <- base::signalCondition [15:31:52.515] sys.calls <- base::sys.calls [15:31:52.515] `[[` <- base::`[[` [15:31:52.515] `+` <- base::`+` [15:31:52.515] `<<-` <- base::`<<-` [15:31:52.515] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:52.515] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:52.515] 3L)] [15:31:52.515] } [15:31:52.515] function(cond) { [15:31:52.515] is_error <- inherits(cond, "error") [15:31:52.515] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:52.515] NULL) [15:31:52.515] if (is_error) { [15:31:52.515] sessionInformation <- function() { [15:31:52.515] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:52.515] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:52.515] search = base::search(), system = base::Sys.info()) [15:31:52.515] } [15:31:52.515] ...future.conditions[[length(...future.conditions) + [15:31:52.515] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:52.515] cond$call), session = sessionInformation(), [15:31:52.515] timestamp = base::Sys.time(), signaled = 0L) [15:31:52.515] signalCondition(cond) [15:31:52.515] } [15:31:52.515] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:52.515] "immediateCondition"))) { [15:31:52.515] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:52.515] ...future.conditions[[length(...future.conditions) + [15:31:52.515] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:52.515] if (TRUE && !signal) { [15:31:52.515] muffleCondition <- function (cond, pattern = "^muffle") [15:31:52.515] { [15:31:52.515] inherits <- base::inherits [15:31:52.515] invokeRestart <- base::invokeRestart [15:31:52.515] is.null <- base::is.null [15:31:52.515] muffled <- FALSE [15:31:52.515] if (inherits(cond, "message")) { [15:31:52.515] muffled <- grepl(pattern, "muffleMessage") [15:31:52.515] if (muffled) [15:31:52.515] invokeRestart("muffleMessage") [15:31:52.515] } [15:31:52.515] else if (inherits(cond, "warning")) { [15:31:52.515] muffled <- grepl(pattern, "muffleWarning") [15:31:52.515] if (muffled) [15:31:52.515] invokeRestart("muffleWarning") [15:31:52.515] } [15:31:52.515] else if (inherits(cond, "condition")) { [15:31:52.515] if (!is.null(pattern)) { [15:31:52.515] computeRestarts <- base::computeRestarts [15:31:52.515] grepl <- base::grepl [15:31:52.515] restarts <- computeRestarts(cond) [15:31:52.515] for (restart in restarts) { [15:31:52.515] name <- restart$name [15:31:52.515] if (is.null(name)) [15:31:52.515] next [15:31:52.515] if (!grepl(pattern, name)) [15:31:52.515] next [15:31:52.515] invokeRestart(restart) [15:31:52.515] muffled <- TRUE [15:31:52.515] break [15:31:52.515] } [15:31:52.515] } [15:31:52.515] } [15:31:52.515] invisible(muffled) [15:31:52.515] } [15:31:52.515] muffleCondition(cond, pattern = "^muffle") [15:31:52.515] } [15:31:52.515] } [15:31:52.515] else { [15:31:52.515] if (TRUE) { [15:31:52.515] muffleCondition <- function (cond, pattern = "^muffle") [15:31:52.515] { [15:31:52.515] inherits <- base::inherits [15:31:52.515] invokeRestart <- base::invokeRestart [15:31:52.515] is.null <- base::is.null [15:31:52.515] muffled <- FALSE [15:31:52.515] if (inherits(cond, "message")) { [15:31:52.515] muffled <- grepl(pattern, "muffleMessage") [15:31:52.515] if (muffled) [15:31:52.515] invokeRestart("muffleMessage") [15:31:52.515] } [15:31:52.515] else if (inherits(cond, "warning")) { [15:31:52.515] muffled <- grepl(pattern, "muffleWarning") [15:31:52.515] if (muffled) [15:31:52.515] invokeRestart("muffleWarning") [15:31:52.515] } [15:31:52.515] else if (inherits(cond, "condition")) { [15:31:52.515] if (!is.null(pattern)) { [15:31:52.515] computeRestarts <- base::computeRestarts [15:31:52.515] grepl <- base::grepl [15:31:52.515] restarts <- computeRestarts(cond) [15:31:52.515] for (restart in restarts) { [15:31:52.515] name <- restart$name [15:31:52.515] if (is.null(name)) [15:31:52.515] next [15:31:52.515] if (!grepl(pattern, name)) [15:31:52.515] next [15:31:52.515] invokeRestart(restart) [15:31:52.515] muffled <- TRUE [15:31:52.515] break [15:31:52.515] } [15:31:52.515] } [15:31:52.515] } [15:31:52.515] invisible(muffled) [15:31:52.515] } [15:31:52.515] muffleCondition(cond, pattern = "^muffle") [15:31:52.515] } [15:31:52.515] } [15:31:52.515] } [15:31:52.515] })) [15:31:52.515] }, error = function(ex) { [15:31:52.515] base::structure(base::list(value = NULL, visible = NULL, [15:31:52.515] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:52.515] ...future.rng), started = ...future.startTime, [15:31:52.515] finished = Sys.time(), session_uuid = NA_character_, [15:31:52.515] version = "1.8"), class = "FutureResult") [15:31:52.515] }, finally = { [15:31:52.515] if (!identical(...future.workdir, getwd())) [15:31:52.515] setwd(...future.workdir) [15:31:52.515] { [15:31:52.515] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:52.515] ...future.oldOptions$nwarnings <- NULL [15:31:52.515] } [15:31:52.515] base::options(...future.oldOptions) [15:31:52.515] if (.Platform$OS.type == "windows") { [15:31:52.515] old_names <- names(...future.oldEnvVars) [15:31:52.515] envs <- base::Sys.getenv() [15:31:52.515] names <- names(envs) [15:31:52.515] common <- intersect(names, old_names) [15:31:52.515] added <- setdiff(names, old_names) [15:31:52.515] removed <- setdiff(old_names, names) [15:31:52.515] changed <- common[...future.oldEnvVars[common] != [15:31:52.515] envs[common]] [15:31:52.515] NAMES <- toupper(changed) [15:31:52.515] args <- list() [15:31:52.515] for (kk in seq_along(NAMES)) { [15:31:52.515] name <- changed[[kk]] [15:31:52.515] NAME <- NAMES[[kk]] [15:31:52.515] if (name != NAME && is.element(NAME, old_names)) [15:31:52.515] next [15:31:52.515] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:52.515] } [15:31:52.515] NAMES <- toupper(added) [15:31:52.515] for (kk in seq_along(NAMES)) { [15:31:52.515] name <- added[[kk]] [15:31:52.515] NAME <- NAMES[[kk]] [15:31:52.515] if (name != NAME && is.element(NAME, old_names)) [15:31:52.515] next [15:31:52.515] args[[name]] <- "" [15:31:52.515] } [15:31:52.515] NAMES <- toupper(removed) [15:31:52.515] for (kk in seq_along(NAMES)) { [15:31:52.515] name <- removed[[kk]] [15:31:52.515] NAME <- NAMES[[kk]] [15:31:52.515] if (name != NAME && is.element(NAME, old_names)) [15:31:52.515] next [15:31:52.515] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:52.515] } [15:31:52.515] if (length(args) > 0) [15:31:52.515] base::do.call(base::Sys.setenv, args = args) [15:31:52.515] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:52.515] } [15:31:52.515] else { [15:31:52.515] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:52.515] } [15:31:52.515] { [15:31:52.515] if (base::length(...future.futureOptionsAdded) > [15:31:52.515] 0L) { [15:31:52.515] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:52.515] base::names(opts) <- ...future.futureOptionsAdded [15:31:52.515] base::options(opts) [15:31:52.515] } [15:31:52.515] { [15:31:52.515] { [15:31:52.515] NULL [15:31:52.515] RNGkind("Mersenne-Twister") [15:31:52.515] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:52.515] inherits = FALSE) [15:31:52.515] } [15:31:52.515] options(future.plan = NULL) [15:31:52.515] if (is.na(NA_character_)) [15:31:52.515] Sys.unsetenv("R_FUTURE_PLAN") [15:31:52.515] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:52.515] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:52.515] .init = FALSE) [15:31:52.515] } [15:31:52.515] } [15:31:52.515] } [15:31:52.515] }) [15:31:52.515] if (TRUE) { [15:31:52.515] base::sink(type = "output", split = FALSE) [15:31:52.515] if (TRUE) { [15:31:52.515] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:52.515] } [15:31:52.515] else { [15:31:52.515] ...future.result["stdout"] <- base::list(NULL) [15:31:52.515] } [15:31:52.515] base::close(...future.stdout) [15:31:52.515] ...future.stdout <- NULL [15:31:52.515] } [15:31:52.515] ...future.result$conditions <- ...future.conditions [15:31:52.515] ...future.result$finished <- base::Sys.time() [15:31:52.515] ...future.result [15:31:52.515] } [15:31:52.523] assign_globals() ... [15:31:52.523] List of 5 [15:31:52.523] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:52.523] $ future.call.arguments :List of 1 [15:31:52.523] ..$ length: int 2 [15:31:52.523] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.523] $ ...future.elements_ii :List of 4 [15:31:52.523] ..$ a: chr "integer" [15:31:52.523] ..$ b: chr "numeric" [15:31:52.523] ..$ c: chr "character" [15:31:52.523] ..$ c: chr "list" [15:31:52.523] $ ...future.seeds_ii : NULL [15:31:52.523] $ ...future.globals.maxSize: NULL [15:31:52.523] - attr(*, "where")=List of 5 [15:31:52.523] ..$ ...future.FUN : [15:31:52.523] ..$ future.call.arguments : [15:31:52.523] ..$ ...future.elements_ii : [15:31:52.523] ..$ ...future.seeds_ii : [15:31:52.523] ..$ ...future.globals.maxSize: [15:31:52.523] - attr(*, "resolved")= logi FALSE [15:31:52.523] - attr(*, "total_size")= num 2240 [15:31:52.523] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.523] - attr(*, "already-done")= logi TRUE [15:31:52.536] - copied '...future.FUN' to environment [15:31:52.536] - copied 'future.call.arguments' to environment [15:31:52.536] - copied '...future.elements_ii' to environment [15:31:52.537] - copied '...future.seeds_ii' to environment [15:31:52.537] - copied '...future.globals.maxSize' to environment [15:31:52.537] assign_globals() ... done [15:31:52.538] plan(): Setting new future strategy stack: [15:31:52.538] List of future strategies: [15:31:52.538] 1. sequential: [15:31:52.538] - args: function (..., envir = parent.frame(), workers = "") [15:31:52.538] - tweaked: FALSE [15:31:52.538] - call: NULL [15:31:52.539] plan(): nbrOfWorkers() = 1 [15:31:52.542] plan(): Setting new future strategy stack: [15:31:52.542] List of future strategies: [15:31:52.542] 1. sequential: [15:31:52.542] - args: function (..., envir = parent.frame(), workers = "") [15:31:52.542] - tweaked: FALSE [15:31:52.542] - call: plan(strategy) [15:31:52.543] plan(): nbrOfWorkers() = 1 [15:31:52.544] SequentialFuture started (and completed) [15:31:52.544] - Launch lazy future ... done [15:31:52.544] run() for 'SequentialFuture' ... done [15:31:52.545] Created future: [15:31:52.545] SequentialFuture: [15:31:52.545] Label: 'future_lapply-1' [15:31:52.545] Expression: [15:31:52.545] { [15:31:52.545] do.call(function(...) { [15:31:52.545] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.545] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:52.545] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.545] on.exit(options(oopts), add = TRUE) [15:31:52.545] } [15:31:52.545] { [15:31:52.545] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:52.545] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.545] ...future.FUN(...future.X_jj, ...) [15:31:52.545] }) [15:31:52.545] } [15:31:52.545] }, args = future.call.arguments) [15:31:52.545] } [15:31:52.545] Lazy evaluation: FALSE [15:31:52.545] Asynchronous evaluation: FALSE [15:31:52.545] Local evaluation: TRUE [15:31:52.545] Environment: R_GlobalEnv [15:31:52.545] Capture standard output: TRUE [15:31:52.545] Capture condition classes: 'condition' (excluding 'nothing') [15:31:52.545] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:52.545] Packages: [15:31:52.545] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:52.545] Resolved: TRUE [15:31:52.545] Value: 240 bytes of class 'list' [15:31:52.545] Early signaling: FALSE [15:31:52.545] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:52.545] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:52.548] Chunk #1 of 1 ... DONE [15:31:52.548] Launching 1 futures (chunks) ... DONE [15:31:52.548] Resolving 1 futures (chunks) ... [15:31:52.549] resolve() on list ... [15:31:52.549] recursive: 0 [15:31:52.549] length: 1 [15:31:52.549] [15:31:52.550] resolved() for 'SequentialFuture' ... [15:31:52.550] - state: 'finished' [15:31:52.550] - run: TRUE [15:31:52.551] - result: 'FutureResult' [15:31:52.551] resolved() for 'SequentialFuture' ... done [15:31:52.551] Future #1 [15:31:52.552] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:52.552] - nx: 1 [15:31:52.552] - relay: TRUE [15:31:52.552] - stdout: TRUE [15:31:52.553] - signal: TRUE [15:31:52.553] - resignal: FALSE [15:31:52.553] - force: TRUE [15:31:52.554] - relayed: [n=1] FALSE [15:31:52.554] - queued futures: [n=1] FALSE [15:31:52.554] - until=1 [15:31:52.554] - relaying element #1 [15:31:52.555] - relayed: [n=1] TRUE [15:31:52.555] - queued futures: [n=1] TRUE [15:31:52.556] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:52.556] length: 0 (resolved future 1) [15:31:52.556] Relaying remaining futures [15:31:52.557] signalConditionsASAP(NULL, pos=0) ... [15:31:52.557] - nx: 1 [15:31:52.557] - relay: TRUE [15:31:52.557] - stdout: TRUE [15:31:52.558] - signal: TRUE [15:31:52.558] - resignal: FALSE [15:31:52.558] - force: TRUE [15:31:52.559] - relayed: [n=1] TRUE [15:31:52.559] - queued futures: [n=1] TRUE - flush all [15:31:52.559] - relayed: [n=1] TRUE [15:31:52.560] - queued futures: [n=1] TRUE [15:31:52.560] signalConditionsASAP(NULL, pos=0) ... done [15:31:52.560] resolve() on list ... DONE [15:31:52.561] - Number of value chunks collected: 1 [15:31:52.561] Resolving 1 futures (chunks) ... DONE [15:31:52.561] Reducing values from 1 chunks ... [15:31:52.562] - Number of values collected after concatenation: 4 [15:31:52.562] - Number of values expected: 4 [15:31:52.562] Reducing values from 1 chunks ... DONE [15:31:52.563] 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 [15:31:52.567] future_lapply() ... [15:31:52.569] Number of chunks: 1 [15:31:52.569] getGlobalsAndPackagesXApply() ... [15:31:52.570] - future.globals: TRUE [15:31:52.570] getGlobalsAndPackages() ... [15:31:52.570] Searching for globals... [15:31:52.573] - globals found: [2] 'FUN', '.Internal' [15:31:52.573] Searching for globals ... DONE [15:31:52.573] Resolving globals: FALSE [15:31:52.579] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:52.580] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:52.580] - globals: [1] 'FUN' [15:31:52.581] [15:31:52.581] getGlobalsAndPackages() ... DONE [15:31:52.581] - globals found/used: [n=1] 'FUN' [15:31:52.581] - needed namespaces: [n=0] [15:31:52.582] Finding globals ... DONE [15:31:52.582] - use_args: TRUE [15:31:52.582] - Getting '...' globals ... [15:31:52.583] resolve() on list ... [15:31:52.584] recursive: 0 [15:31:52.584] length: 1 [15:31:52.584] elements: '...' [15:31:52.585] length: 0 (resolved future 1) [15:31:52.585] resolve() on list ... DONE [15:31:52.585] - '...' content: [n=1] 'length' [15:31:52.585] List of 1 [15:31:52.585] $ ...:List of 1 [15:31:52.585] ..$ length: int 2 [15:31:52.585] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.585] - attr(*, "where")=List of 1 [15:31:52.585] ..$ ...: [15:31:52.585] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.585] - attr(*, "resolved")= logi TRUE [15:31:52.585] - attr(*, "total_size")= num NA [15:31:52.592] - Getting '...' globals ... DONE [15:31:52.592] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:52.593] List of 2 [15:31:52.593] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:52.593] $ ... :List of 1 [15:31:52.593] ..$ length: int 2 [15:31:52.593] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.593] - attr(*, "where")=List of 2 [15:31:52.593] ..$ ...future.FUN: [15:31:52.593] ..$ ... : [15:31:52.593] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.593] - attr(*, "resolved")= logi FALSE [15:31:52.593] - attr(*, "total_size")= num 2240 [15:31:52.599] Packages to be attached in all futures: [n=0] [15:31:52.599] getGlobalsAndPackagesXApply() ... DONE [15:31:52.600] Number of futures (= number of chunks): 1 [15:31:52.600] Launching 1 futures (chunks) ... [15:31:52.600] Chunk #1 of 1 ... [15:31:52.600] - Finding globals in 'X' for chunk #1 ... [15:31:52.601] getGlobalsAndPackages() ... [15:31:52.601] Searching for globals... [15:31:52.602] [15:31:52.602] Searching for globals ... DONE [15:31:52.602] - globals: [0] [15:31:52.602] getGlobalsAndPackages() ... DONE [15:31:52.603] + additional globals found: [n=0] [15:31:52.603] + additional namespaces needed: [n=0] [15:31:52.603] - Finding globals in 'X' for chunk #1 ... DONE [15:31:52.603] - seeds: [15:31:52.604] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.604] getGlobalsAndPackages() ... [15:31:52.604] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.605] Resolving globals: FALSE [15:31:52.605] Tweak future expression to call with '...' arguments ... [15:31:52.605] { [15:31:52.605] do.call(function(...) { [15:31:52.605] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.605] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:52.605] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.605] on.exit(options(oopts), add = TRUE) [15:31:52.605] } [15:31:52.605] { [15:31:52.605] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:52.605] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.605] ...future.FUN(...future.X_jj, ...) [15:31:52.605] }) [15:31:52.605] } [15:31:52.605] }, args = future.call.arguments) [15:31:52.605] } [15:31:52.606] Tweak future expression to call with '...' arguments ... DONE [15:31:52.607] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.607] [15:31:52.608] getGlobalsAndPackages() ... DONE [15:31:52.608] run() for 'Future' ... [15:31:52.609] - state: 'created' [15:31:52.609] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:52.610] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:52.610] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:52.610] - Field: 'label' [15:31:52.611] - Field: 'local' [15:31:52.611] - Field: 'owner' [15:31:52.611] - Field: 'envir' [15:31:52.611] - Field: 'packages' [15:31:52.612] - Field: 'gc' [15:31:52.612] - Field: 'conditions' [15:31:52.612] - Field: 'expr' [15:31:52.612] - Field: 'uuid' [15:31:52.613] - Field: 'seed' [15:31:52.613] - Field: 'version' [15:31:52.613] - Field: 'result' [15:31:52.614] - Field: 'asynchronous' [15:31:52.614] - Field: 'calls' [15:31:52.614] - Field: 'globals' [15:31:52.614] - Field: 'stdout' [15:31:52.615] - Field: 'earlySignal' [15:31:52.615] - Field: 'lazy' [15:31:52.615] - Field: 'state' [15:31:52.615] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:52.616] - Launch lazy future ... [15:31:52.616] Packages needed by the future expression (n = 0): [15:31:52.616] Packages needed by future strategies (n = 0): [15:31:52.617] { [15:31:52.617] { [15:31:52.617] { [15:31:52.617] ...future.startTime <- base::Sys.time() [15:31:52.617] { [15:31:52.617] { [15:31:52.617] { [15:31:52.617] base::local({ [15:31:52.617] has_future <- base::requireNamespace("future", [15:31:52.617] quietly = TRUE) [15:31:52.617] if (has_future) { [15:31:52.617] ns <- base::getNamespace("future") [15:31:52.617] version <- ns[[".package"]][["version"]] [15:31:52.617] if (is.null(version)) [15:31:52.617] version <- utils::packageVersion("future") [15:31:52.617] } [15:31:52.617] else { [15:31:52.617] version <- NULL [15:31:52.617] } [15:31:52.617] if (!has_future || version < "1.8.0") { [15:31:52.617] info <- base::c(r_version = base::gsub("R version ", [15:31:52.617] "", base::R.version$version.string), [15:31:52.617] platform = base::sprintf("%s (%s-bit)", [15:31:52.617] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:52.617] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:52.617] "release", "version")], collapse = " "), [15:31:52.617] hostname = base::Sys.info()[["nodename"]]) [15:31:52.617] info <- base::sprintf("%s: %s", base::names(info), [15:31:52.617] info) [15:31:52.617] info <- base::paste(info, collapse = "; ") [15:31:52.617] if (!has_future) { [15:31:52.617] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:52.617] info) [15:31:52.617] } [15:31:52.617] else { [15:31:52.617] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:52.617] info, version) [15:31:52.617] } [15:31:52.617] base::stop(msg) [15:31:52.617] } [15:31:52.617] }) [15:31:52.617] } [15:31:52.617] ...future.strategy.old <- future::plan("list") [15:31:52.617] options(future.plan = NULL) [15:31:52.617] Sys.unsetenv("R_FUTURE_PLAN") [15:31:52.617] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:52.617] } [15:31:52.617] ...future.workdir <- getwd() [15:31:52.617] } [15:31:52.617] ...future.oldOptions <- base::as.list(base::.Options) [15:31:52.617] ...future.oldEnvVars <- base::Sys.getenv() [15:31:52.617] } [15:31:52.617] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:52.617] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:52.617] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:52.617] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:52.617] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:52.617] future.stdout.windows.reencode = NULL, width = 80L) [15:31:52.617] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:52.617] base::names(...future.oldOptions)) [15:31:52.617] } [15:31:52.617] if (FALSE) { [15:31:52.617] } [15:31:52.617] else { [15:31:52.617] if (TRUE) { [15:31:52.617] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:52.617] open = "w") [15:31:52.617] } [15:31:52.617] else { [15:31:52.617] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:52.617] windows = "NUL", "/dev/null"), open = "w") [15:31:52.617] } [15:31:52.617] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:52.617] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:52.617] base::sink(type = "output", split = FALSE) [15:31:52.617] base::close(...future.stdout) [15:31:52.617] }, add = TRUE) [15:31:52.617] } [15:31:52.617] ...future.frame <- base::sys.nframe() [15:31:52.617] ...future.conditions <- base::list() [15:31:52.617] ...future.rng <- base::globalenv()$.Random.seed [15:31:52.617] if (FALSE) { [15:31:52.617] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:52.617] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:52.617] } [15:31:52.617] ...future.result <- base::tryCatch({ [15:31:52.617] base::withCallingHandlers({ [15:31:52.617] ...future.value <- base::withVisible(base::local({ [15:31:52.617] do.call(function(...) { [15:31:52.617] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.617] if (!identical(...future.globals.maxSize.org, [15:31:52.617] ...future.globals.maxSize)) { [15:31:52.617] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.617] on.exit(options(oopts), add = TRUE) [15:31:52.617] } [15:31:52.617] { [15:31:52.617] lapply(seq_along(...future.elements_ii), [15:31:52.617] FUN = function(jj) { [15:31:52.617] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.617] ...future.FUN(...future.X_jj, ...) [15:31:52.617] }) [15:31:52.617] } [15:31:52.617] }, args = future.call.arguments) [15:31:52.617] })) [15:31:52.617] future::FutureResult(value = ...future.value$value, [15:31:52.617] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:52.617] ...future.rng), globalenv = if (FALSE) [15:31:52.617] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:52.617] ...future.globalenv.names)) [15:31:52.617] else NULL, started = ...future.startTime, version = "1.8") [15:31:52.617] }, condition = base::local({ [15:31:52.617] c <- base::c [15:31:52.617] inherits <- base::inherits [15:31:52.617] invokeRestart <- base::invokeRestart [15:31:52.617] length <- base::length [15:31:52.617] list <- base::list [15:31:52.617] seq.int <- base::seq.int [15:31:52.617] signalCondition <- base::signalCondition [15:31:52.617] sys.calls <- base::sys.calls [15:31:52.617] `[[` <- base::`[[` [15:31:52.617] `+` <- base::`+` [15:31:52.617] `<<-` <- base::`<<-` [15:31:52.617] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:52.617] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:52.617] 3L)] [15:31:52.617] } [15:31:52.617] function(cond) { [15:31:52.617] is_error <- inherits(cond, "error") [15:31:52.617] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:52.617] NULL) [15:31:52.617] if (is_error) { [15:31:52.617] sessionInformation <- function() { [15:31:52.617] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:52.617] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:52.617] search = base::search(), system = base::Sys.info()) [15:31:52.617] } [15:31:52.617] ...future.conditions[[length(...future.conditions) + [15:31:52.617] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:52.617] cond$call), session = sessionInformation(), [15:31:52.617] timestamp = base::Sys.time(), signaled = 0L) [15:31:52.617] signalCondition(cond) [15:31:52.617] } [15:31:52.617] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:52.617] "immediateCondition"))) { [15:31:52.617] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:52.617] ...future.conditions[[length(...future.conditions) + [15:31:52.617] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:52.617] if (TRUE && !signal) { [15:31:52.617] muffleCondition <- function (cond, pattern = "^muffle") [15:31:52.617] { [15:31:52.617] inherits <- base::inherits [15:31:52.617] invokeRestart <- base::invokeRestart [15:31:52.617] is.null <- base::is.null [15:31:52.617] muffled <- FALSE [15:31:52.617] if (inherits(cond, "message")) { [15:31:52.617] muffled <- grepl(pattern, "muffleMessage") [15:31:52.617] if (muffled) [15:31:52.617] invokeRestart("muffleMessage") [15:31:52.617] } [15:31:52.617] else if (inherits(cond, "warning")) { [15:31:52.617] muffled <- grepl(pattern, "muffleWarning") [15:31:52.617] if (muffled) [15:31:52.617] invokeRestart("muffleWarning") [15:31:52.617] } [15:31:52.617] else if (inherits(cond, "condition")) { [15:31:52.617] if (!is.null(pattern)) { [15:31:52.617] computeRestarts <- base::computeRestarts [15:31:52.617] grepl <- base::grepl [15:31:52.617] restarts <- computeRestarts(cond) [15:31:52.617] for (restart in restarts) { [15:31:52.617] name <- restart$name [15:31:52.617] if (is.null(name)) [15:31:52.617] next [15:31:52.617] if (!grepl(pattern, name)) [15:31:52.617] next [15:31:52.617] invokeRestart(restart) [15:31:52.617] muffled <- TRUE [15:31:52.617] break [15:31:52.617] } [15:31:52.617] } [15:31:52.617] } [15:31:52.617] invisible(muffled) [15:31:52.617] } [15:31:52.617] muffleCondition(cond, pattern = "^muffle") [15:31:52.617] } [15:31:52.617] } [15:31:52.617] else { [15:31:52.617] if (TRUE) { [15:31:52.617] muffleCondition <- function (cond, pattern = "^muffle") [15:31:52.617] { [15:31:52.617] inherits <- base::inherits [15:31:52.617] invokeRestart <- base::invokeRestart [15:31:52.617] is.null <- base::is.null [15:31:52.617] muffled <- FALSE [15:31:52.617] if (inherits(cond, "message")) { [15:31:52.617] muffled <- grepl(pattern, "muffleMessage") [15:31:52.617] if (muffled) [15:31:52.617] invokeRestart("muffleMessage") [15:31:52.617] } [15:31:52.617] else if (inherits(cond, "warning")) { [15:31:52.617] muffled <- grepl(pattern, "muffleWarning") [15:31:52.617] if (muffled) [15:31:52.617] invokeRestart("muffleWarning") [15:31:52.617] } [15:31:52.617] else if (inherits(cond, "condition")) { [15:31:52.617] if (!is.null(pattern)) { [15:31:52.617] computeRestarts <- base::computeRestarts [15:31:52.617] grepl <- base::grepl [15:31:52.617] restarts <- computeRestarts(cond) [15:31:52.617] for (restart in restarts) { [15:31:52.617] name <- restart$name [15:31:52.617] if (is.null(name)) [15:31:52.617] next [15:31:52.617] if (!grepl(pattern, name)) [15:31:52.617] next [15:31:52.617] invokeRestart(restart) [15:31:52.617] muffled <- TRUE [15:31:52.617] break [15:31:52.617] } [15:31:52.617] } [15:31:52.617] } [15:31:52.617] invisible(muffled) [15:31:52.617] } [15:31:52.617] muffleCondition(cond, pattern = "^muffle") [15:31:52.617] } [15:31:52.617] } [15:31:52.617] } [15:31:52.617] })) [15:31:52.617] }, error = function(ex) { [15:31:52.617] base::structure(base::list(value = NULL, visible = NULL, [15:31:52.617] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:52.617] ...future.rng), started = ...future.startTime, [15:31:52.617] finished = Sys.time(), session_uuid = NA_character_, [15:31:52.617] version = "1.8"), class = "FutureResult") [15:31:52.617] }, finally = { [15:31:52.617] if (!identical(...future.workdir, getwd())) [15:31:52.617] setwd(...future.workdir) [15:31:52.617] { [15:31:52.617] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:52.617] ...future.oldOptions$nwarnings <- NULL [15:31:52.617] } [15:31:52.617] base::options(...future.oldOptions) [15:31:52.617] if (.Platform$OS.type == "windows") { [15:31:52.617] old_names <- names(...future.oldEnvVars) [15:31:52.617] envs <- base::Sys.getenv() [15:31:52.617] names <- names(envs) [15:31:52.617] common <- intersect(names, old_names) [15:31:52.617] added <- setdiff(names, old_names) [15:31:52.617] removed <- setdiff(old_names, names) [15:31:52.617] changed <- common[...future.oldEnvVars[common] != [15:31:52.617] envs[common]] [15:31:52.617] NAMES <- toupper(changed) [15:31:52.617] args <- list() [15:31:52.617] for (kk in seq_along(NAMES)) { [15:31:52.617] name <- changed[[kk]] [15:31:52.617] NAME <- NAMES[[kk]] [15:31:52.617] if (name != NAME && is.element(NAME, old_names)) [15:31:52.617] next [15:31:52.617] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:52.617] } [15:31:52.617] NAMES <- toupper(added) [15:31:52.617] for (kk in seq_along(NAMES)) { [15:31:52.617] name <- added[[kk]] [15:31:52.617] NAME <- NAMES[[kk]] [15:31:52.617] if (name != NAME && is.element(NAME, old_names)) [15:31:52.617] next [15:31:52.617] args[[name]] <- "" [15:31:52.617] } [15:31:52.617] NAMES <- toupper(removed) [15:31:52.617] for (kk in seq_along(NAMES)) { [15:31:52.617] name <- removed[[kk]] [15:31:52.617] NAME <- NAMES[[kk]] [15:31:52.617] if (name != NAME && is.element(NAME, old_names)) [15:31:52.617] next [15:31:52.617] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:52.617] } [15:31:52.617] if (length(args) > 0) [15:31:52.617] base::do.call(base::Sys.setenv, args = args) [15:31:52.617] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:52.617] } [15:31:52.617] else { [15:31:52.617] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:52.617] } [15:31:52.617] { [15:31:52.617] if (base::length(...future.futureOptionsAdded) > [15:31:52.617] 0L) { [15:31:52.617] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:52.617] base::names(opts) <- ...future.futureOptionsAdded [15:31:52.617] base::options(opts) [15:31:52.617] } [15:31:52.617] { [15:31:52.617] { [15:31:52.617] NULL [15:31:52.617] RNGkind("Mersenne-Twister") [15:31:52.617] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:52.617] inherits = FALSE) [15:31:52.617] } [15:31:52.617] options(future.plan = NULL) [15:31:52.617] if (is.na(NA_character_)) [15:31:52.617] Sys.unsetenv("R_FUTURE_PLAN") [15:31:52.617] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:52.617] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:52.617] .init = FALSE) [15:31:52.617] } [15:31:52.617] } [15:31:52.617] } [15:31:52.617] }) [15:31:52.617] if (TRUE) { [15:31:52.617] base::sink(type = "output", split = FALSE) [15:31:52.617] if (TRUE) { [15:31:52.617] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:52.617] } [15:31:52.617] else { [15:31:52.617] ...future.result["stdout"] <- base::list(NULL) [15:31:52.617] } [15:31:52.617] base::close(...future.stdout) [15:31:52.617] ...future.stdout <- NULL [15:31:52.617] } [15:31:52.617] ...future.result$conditions <- ...future.conditions [15:31:52.617] ...future.result$finished <- base::Sys.time() [15:31:52.617] ...future.result [15:31:52.617] } [15:31:52.624] assign_globals() ... [15:31:52.624] List of 5 [15:31:52.624] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:52.624] $ future.call.arguments :List of 1 [15:31:52.624] ..$ length: int 2 [15:31:52.624] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.624] $ ...future.elements_ii :List of 4 [15:31:52.624] ..$ a: chr "integer" [15:31:52.624] ..$ b: chr "numeric" [15:31:52.624] ..$ c: chr "character" [15:31:52.624] ..$ c: chr "list" [15:31:52.624] $ ...future.seeds_ii : NULL [15:31:52.624] $ ...future.globals.maxSize: NULL [15:31:52.624] - attr(*, "where")=List of 5 [15:31:52.624] ..$ ...future.FUN : [15:31:52.624] ..$ future.call.arguments : [15:31:52.624] ..$ ...future.elements_ii : [15:31:52.624] ..$ ...future.seeds_ii : [15:31:52.624] ..$ ...future.globals.maxSize: [15:31:52.624] - attr(*, "resolved")= logi FALSE [15:31:52.624] - attr(*, "total_size")= num 2240 [15:31:52.624] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.624] - attr(*, "already-done")= logi TRUE [15:31:52.635] - copied '...future.FUN' to environment [15:31:52.636] - copied 'future.call.arguments' to environment [15:31:52.636] - copied '...future.elements_ii' to environment [15:31:52.636] - copied '...future.seeds_ii' to environment [15:31:52.636] - copied '...future.globals.maxSize' to environment [15:31:52.637] assign_globals() ... done [15:31:52.637] plan(): Setting new future strategy stack: [15:31:52.638] List of future strategies: [15:31:52.638] 1. sequential: [15:31:52.638] - args: function (..., envir = parent.frame(), workers = "") [15:31:52.638] - tweaked: FALSE [15:31:52.638] - call: NULL [15:31:52.639] plan(): nbrOfWorkers() = 1 [15:31:52.641] plan(): Setting new future strategy stack: [15:31:52.641] List of future strategies: [15:31:52.641] 1. sequential: [15:31:52.641] - args: function (..., envir = parent.frame(), workers = "") [15:31:52.641] - tweaked: FALSE [15:31:52.641] - call: plan(strategy) [15:31:52.642] plan(): nbrOfWorkers() = 1 [15:31:52.642] SequentialFuture started (and completed) [15:31:52.643] - Launch lazy future ... done [15:31:52.643] run() for 'SequentialFuture' ... done [15:31:52.644] Created future: [15:31:52.644] SequentialFuture: [15:31:52.644] Label: 'future_lapply-1' [15:31:52.644] Expression: [15:31:52.644] { [15:31:52.644] do.call(function(...) { [15:31:52.644] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.644] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:52.644] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.644] on.exit(options(oopts), add = TRUE) [15:31:52.644] } [15:31:52.644] { [15:31:52.644] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:52.644] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.644] ...future.FUN(...future.X_jj, ...) [15:31:52.644] }) [15:31:52.644] } [15:31:52.644] }, args = future.call.arguments) [15:31:52.644] } [15:31:52.644] Lazy evaluation: FALSE [15:31:52.644] Asynchronous evaluation: FALSE [15:31:52.644] Local evaluation: TRUE [15:31:52.644] Environment: R_GlobalEnv [15:31:52.644] Capture standard output: TRUE [15:31:52.644] Capture condition classes: 'condition' (excluding 'nothing') [15:31:52.644] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:52.644] Packages: [15:31:52.644] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:52.644] Resolved: TRUE [15:31:52.644] Value: 240 bytes of class 'list' [15:31:52.644] Early signaling: FALSE [15:31:52.644] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:52.644] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:52.646] Chunk #1 of 1 ... DONE [15:31:52.646] Launching 1 futures (chunks) ... DONE [15:31:52.647] Resolving 1 futures (chunks) ... [15:31:52.647] resolve() on list ... [15:31:52.647] recursive: 0 [15:31:52.647] length: 1 [15:31:52.648] [15:31:52.648] resolved() for 'SequentialFuture' ... [15:31:52.648] - state: 'finished' [15:31:52.649] - run: TRUE [15:31:52.649] - result: 'FutureResult' [15:31:52.649] resolved() for 'SequentialFuture' ... done [15:31:52.649] Future #1 [15:31:52.650] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:52.650] - nx: 1 [15:31:52.650] - relay: TRUE [15:31:52.651] - stdout: TRUE [15:31:52.651] - signal: TRUE [15:31:52.651] - resignal: FALSE [15:31:52.651] - force: TRUE [15:31:52.652] - relayed: [n=1] FALSE [15:31:52.652] - queued futures: [n=1] FALSE [15:31:52.652] - until=1 [15:31:52.652] - relaying element #1 [15:31:52.653] - relayed: [n=1] TRUE [15:31:52.653] - queued futures: [n=1] TRUE [15:31:52.653] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:52.654] length: 0 (resolved future 1) [15:31:52.654] Relaying remaining futures [15:31:52.654] signalConditionsASAP(NULL, pos=0) ... [15:31:52.654] - nx: 1 [15:31:52.655] - relay: TRUE [15:31:52.655] - stdout: TRUE [15:31:52.655] - signal: TRUE [15:31:52.655] - resignal: FALSE [15:31:52.656] - force: TRUE [15:31:52.656] - relayed: [n=1] TRUE [15:31:52.656] - queued futures: [n=1] TRUE - flush all [15:31:52.657] - relayed: [n=1] TRUE [15:31:52.657] - queued futures: [n=1] TRUE [15:31:52.657] signalConditionsASAP(NULL, pos=0) ... done [15:31:52.658] resolve() on list ... DONE [15:31:52.658] - Number of value chunks collected: 1 [15:31:52.658] Resolving 1 futures (chunks) ... DONE [15:31:52.659] Reducing values from 1 chunks ... [15:31:52.659] - Number of values collected after concatenation: 4 [15:31:52.660] - Number of values expected: 4 [15:31:52.660] Reducing values from 1 chunks ... DONE [15:31:52.660] 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, ...) ... [15:31:52.665] future_lapply() ... [15:31:52.667] Number of chunks: 1 [15:31:52.667] getGlobalsAndPackagesXApply() ... [15:31:52.668] - future.globals: TRUE [15:31:52.668] getGlobalsAndPackages() ... [15:31:52.668] Searching for globals... [15:31:52.671] - globals found: [2] 'FUN', '.Internal' [15:31:52.671] Searching for globals ... DONE [15:31:52.672] Resolving globals: FALSE [15:31:52.672] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:52.673] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:52.673] - globals: [1] 'FUN' [15:31:52.673] [15:31:52.674] getGlobalsAndPackages() ... DONE [15:31:52.674] - globals found/used: [n=1] 'FUN' [15:31:52.674] - needed namespaces: [n=0] [15:31:52.674] Finding globals ... DONE [15:31:52.675] - use_args: TRUE [15:31:52.675] - Getting '...' globals ... [15:31:52.675] resolve() on list ... [15:31:52.676] recursive: 0 [15:31:52.676] length: 1 [15:31:52.676] elements: '...' [15:31:52.676] length: 0 (resolved future 1) [15:31:52.677] resolve() on list ... DONE [15:31:52.677] - '...' content: [n=1] 'length' [15:31:52.677] List of 1 [15:31:52.677] $ ...:List of 1 [15:31:52.677] ..$ length: int 2 [15:31:52.677] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.677] - attr(*, "where")=List of 1 [15:31:52.677] ..$ ...: [15:31:52.677] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.677] - attr(*, "resolved")= logi TRUE [15:31:52.677] - attr(*, "total_size")= num NA [15:31:52.685] - Getting '...' globals ... DONE [15:31:52.685] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:52.686] List of 2 [15:31:52.686] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:52.686] $ ... :List of 1 [15:31:52.686] ..$ length: int 2 [15:31:52.686] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.686] - attr(*, "where")=List of 2 [15:31:52.686] ..$ ...future.FUN: [15:31:52.686] ..$ ... : [15:31:52.686] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.686] - attr(*, "resolved")= logi FALSE [15:31:52.686] - attr(*, "total_size")= num 2240 [15:31:52.693] Packages to be attached in all futures: [n=0] [15:31:52.694] getGlobalsAndPackagesXApply() ... DONE [15:31:52.694] Number of futures (= number of chunks): 1 [15:31:52.695] Launching 1 futures (chunks) ... [15:31:52.695] Chunk #1 of 1 ... [15:31:52.695] - Finding globals in 'X' for chunk #1 ... [15:31:52.696] getGlobalsAndPackages() ... [15:31:52.696] Searching for globals... [15:31:52.697] [15:31:52.697] Searching for globals ... DONE [15:31:52.697] - globals: [0] [15:31:52.698] getGlobalsAndPackages() ... DONE [15:31:52.698] + additional globals found: [n=0] [15:31:52.698] + additional namespaces needed: [n=0] [15:31:52.699] - Finding globals in 'X' for chunk #1 ... DONE [15:31:52.699] - seeds: [15:31:52.699] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.700] getGlobalsAndPackages() ... [15:31:52.700] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.700] Resolving globals: FALSE [15:31:52.701] Tweak future expression to call with '...' arguments ... [15:31:52.701] { [15:31:52.701] do.call(function(...) { [15:31:52.701] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.701] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:52.701] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.701] on.exit(options(oopts), add = TRUE) [15:31:52.701] } [15:31:52.701] { [15:31:52.701] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:52.701] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.701] ...future.FUN(...future.X_jj, ...) [15:31:52.701] }) [15:31:52.701] } [15:31:52.701] }, args = future.call.arguments) [15:31:52.701] } [15:31:52.702] Tweak future expression to call with '...' arguments ... DONE [15:31:52.703] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.704] [15:31:52.704] getGlobalsAndPackages() ... DONE [15:31:52.705] run() for 'Future' ... [15:31:52.705] - state: 'created' [15:31:52.706] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:52.706] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:52.707] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:52.707] - Field: 'label' [15:31:52.707] - Field: 'local' [15:31:52.708] - Field: 'owner' [15:31:52.708] - Field: 'envir' [15:31:52.708] - Field: 'packages' [15:31:52.709] - Field: 'gc' [15:31:52.709] - Field: 'conditions' [15:31:52.710] - Field: 'expr' [15:31:52.710] - Field: 'uuid' [15:31:52.710] - Field: 'seed' [15:31:52.711] - Field: 'version' [15:31:52.711] - Field: 'result' [15:31:52.711] - Field: 'asynchronous' [15:31:52.712] - Field: 'calls' [15:31:52.712] - Field: 'globals' [15:31:52.713] - Field: 'stdout' [15:31:52.713] - Field: 'earlySignal' [15:31:52.713] - Field: 'lazy' [15:31:52.714] - Field: 'state' [15:31:52.714] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:52.715] - Launch lazy future ... [15:31:52.715] Packages needed by the future expression (n = 0): [15:31:52.716] Packages needed by future strategies (n = 0): [15:31:52.717] { [15:31:52.717] { [15:31:52.717] { [15:31:52.717] ...future.startTime <- base::Sys.time() [15:31:52.717] { [15:31:52.717] { [15:31:52.717] { [15:31:52.717] base::local({ [15:31:52.717] has_future <- base::requireNamespace("future", [15:31:52.717] quietly = TRUE) [15:31:52.717] if (has_future) { [15:31:52.717] ns <- base::getNamespace("future") [15:31:52.717] version <- ns[[".package"]][["version"]] [15:31:52.717] if (is.null(version)) [15:31:52.717] version <- utils::packageVersion("future") [15:31:52.717] } [15:31:52.717] else { [15:31:52.717] version <- NULL [15:31:52.717] } [15:31:52.717] if (!has_future || version < "1.8.0") { [15:31:52.717] info <- base::c(r_version = base::gsub("R version ", [15:31:52.717] "", base::R.version$version.string), [15:31:52.717] platform = base::sprintf("%s (%s-bit)", [15:31:52.717] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:52.717] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:52.717] "release", "version")], collapse = " "), [15:31:52.717] hostname = base::Sys.info()[["nodename"]]) [15:31:52.717] info <- base::sprintf("%s: %s", base::names(info), [15:31:52.717] info) [15:31:52.717] info <- base::paste(info, collapse = "; ") [15:31:52.717] if (!has_future) { [15:31:52.717] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:52.717] info) [15:31:52.717] } [15:31:52.717] else { [15:31:52.717] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:52.717] info, version) [15:31:52.717] } [15:31:52.717] base::stop(msg) [15:31:52.717] } [15:31:52.717] }) [15:31:52.717] } [15:31:52.717] ...future.strategy.old <- future::plan("list") [15:31:52.717] options(future.plan = NULL) [15:31:52.717] Sys.unsetenv("R_FUTURE_PLAN") [15:31:52.717] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:52.717] } [15:31:52.717] ...future.workdir <- getwd() [15:31:52.717] } [15:31:52.717] ...future.oldOptions <- base::as.list(base::.Options) [15:31:52.717] ...future.oldEnvVars <- base::Sys.getenv() [15:31:52.717] } [15:31:52.717] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:52.717] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:52.717] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:52.717] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:52.717] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:52.717] future.stdout.windows.reencode = NULL, width = 80L) [15:31:52.717] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:52.717] base::names(...future.oldOptions)) [15:31:52.717] } [15:31:52.717] if (FALSE) { [15:31:52.717] } [15:31:52.717] else { [15:31:52.717] if (TRUE) { [15:31:52.717] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:52.717] open = "w") [15:31:52.717] } [15:31:52.717] else { [15:31:52.717] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:52.717] windows = "NUL", "/dev/null"), open = "w") [15:31:52.717] } [15:31:52.717] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:52.717] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:52.717] base::sink(type = "output", split = FALSE) [15:31:52.717] base::close(...future.stdout) [15:31:52.717] }, add = TRUE) [15:31:52.717] } [15:31:52.717] ...future.frame <- base::sys.nframe() [15:31:52.717] ...future.conditions <- base::list() [15:31:52.717] ...future.rng <- base::globalenv()$.Random.seed [15:31:52.717] if (FALSE) { [15:31:52.717] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:52.717] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:52.717] } [15:31:52.717] ...future.result <- base::tryCatch({ [15:31:52.717] base::withCallingHandlers({ [15:31:52.717] ...future.value <- base::withVisible(base::local({ [15:31:52.717] do.call(function(...) { [15:31:52.717] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.717] if (!identical(...future.globals.maxSize.org, [15:31:52.717] ...future.globals.maxSize)) { [15:31:52.717] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.717] on.exit(options(oopts), add = TRUE) [15:31:52.717] } [15:31:52.717] { [15:31:52.717] lapply(seq_along(...future.elements_ii), [15:31:52.717] FUN = function(jj) { [15:31:52.717] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.717] ...future.FUN(...future.X_jj, ...) [15:31:52.717] }) [15:31:52.717] } [15:31:52.717] }, args = future.call.arguments) [15:31:52.717] })) [15:31:52.717] future::FutureResult(value = ...future.value$value, [15:31:52.717] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:52.717] ...future.rng), globalenv = if (FALSE) [15:31:52.717] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:52.717] ...future.globalenv.names)) [15:31:52.717] else NULL, started = ...future.startTime, version = "1.8") [15:31:52.717] }, condition = base::local({ [15:31:52.717] c <- base::c [15:31:52.717] inherits <- base::inherits [15:31:52.717] invokeRestart <- base::invokeRestart [15:31:52.717] length <- base::length [15:31:52.717] list <- base::list [15:31:52.717] seq.int <- base::seq.int [15:31:52.717] signalCondition <- base::signalCondition [15:31:52.717] sys.calls <- base::sys.calls [15:31:52.717] `[[` <- base::`[[` [15:31:52.717] `+` <- base::`+` [15:31:52.717] `<<-` <- base::`<<-` [15:31:52.717] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:52.717] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:52.717] 3L)] [15:31:52.717] } [15:31:52.717] function(cond) { [15:31:52.717] is_error <- inherits(cond, "error") [15:31:52.717] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:52.717] NULL) [15:31:52.717] if (is_error) { [15:31:52.717] sessionInformation <- function() { [15:31:52.717] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:52.717] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:52.717] search = base::search(), system = base::Sys.info()) [15:31:52.717] } [15:31:52.717] ...future.conditions[[length(...future.conditions) + [15:31:52.717] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:52.717] cond$call), session = sessionInformation(), [15:31:52.717] timestamp = base::Sys.time(), signaled = 0L) [15:31:52.717] signalCondition(cond) [15:31:52.717] } [15:31:52.717] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:52.717] "immediateCondition"))) { [15:31:52.717] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:52.717] ...future.conditions[[length(...future.conditions) + [15:31:52.717] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:52.717] if (TRUE && !signal) { [15:31:52.717] muffleCondition <- function (cond, pattern = "^muffle") [15:31:52.717] { [15:31:52.717] inherits <- base::inherits [15:31:52.717] invokeRestart <- base::invokeRestart [15:31:52.717] is.null <- base::is.null [15:31:52.717] muffled <- FALSE [15:31:52.717] if (inherits(cond, "message")) { [15:31:52.717] muffled <- grepl(pattern, "muffleMessage") [15:31:52.717] if (muffled) [15:31:52.717] invokeRestart("muffleMessage") [15:31:52.717] } [15:31:52.717] else if (inherits(cond, "warning")) { [15:31:52.717] muffled <- grepl(pattern, "muffleWarning") [15:31:52.717] if (muffled) [15:31:52.717] invokeRestart("muffleWarning") [15:31:52.717] } [15:31:52.717] else if (inherits(cond, "condition")) { [15:31:52.717] if (!is.null(pattern)) { [15:31:52.717] computeRestarts <- base::computeRestarts [15:31:52.717] grepl <- base::grepl [15:31:52.717] restarts <- computeRestarts(cond) [15:31:52.717] for (restart in restarts) { [15:31:52.717] name <- restart$name [15:31:52.717] if (is.null(name)) [15:31:52.717] next [15:31:52.717] if (!grepl(pattern, name)) [15:31:52.717] next [15:31:52.717] invokeRestart(restart) [15:31:52.717] muffled <- TRUE [15:31:52.717] break [15:31:52.717] } [15:31:52.717] } [15:31:52.717] } [15:31:52.717] invisible(muffled) [15:31:52.717] } [15:31:52.717] muffleCondition(cond, pattern = "^muffle") [15:31:52.717] } [15:31:52.717] } [15:31:52.717] else { [15:31:52.717] if (TRUE) { [15:31:52.717] muffleCondition <- function (cond, pattern = "^muffle") [15:31:52.717] { [15:31:52.717] inherits <- base::inherits [15:31:52.717] invokeRestart <- base::invokeRestart [15:31:52.717] is.null <- base::is.null [15:31:52.717] muffled <- FALSE [15:31:52.717] if (inherits(cond, "message")) { [15:31:52.717] muffled <- grepl(pattern, "muffleMessage") [15:31:52.717] if (muffled) [15:31:52.717] invokeRestart("muffleMessage") [15:31:52.717] } [15:31:52.717] else if (inherits(cond, "warning")) { [15:31:52.717] muffled <- grepl(pattern, "muffleWarning") [15:31:52.717] if (muffled) [15:31:52.717] invokeRestart("muffleWarning") [15:31:52.717] } [15:31:52.717] else if (inherits(cond, "condition")) { [15:31:52.717] if (!is.null(pattern)) { [15:31:52.717] computeRestarts <- base::computeRestarts [15:31:52.717] grepl <- base::grepl [15:31:52.717] restarts <- computeRestarts(cond) [15:31:52.717] for (restart in restarts) { [15:31:52.717] name <- restart$name [15:31:52.717] if (is.null(name)) [15:31:52.717] next [15:31:52.717] if (!grepl(pattern, name)) [15:31:52.717] next [15:31:52.717] invokeRestart(restart) [15:31:52.717] muffled <- TRUE [15:31:52.717] break [15:31:52.717] } [15:31:52.717] } [15:31:52.717] } [15:31:52.717] invisible(muffled) [15:31:52.717] } [15:31:52.717] muffleCondition(cond, pattern = "^muffle") [15:31:52.717] } [15:31:52.717] } [15:31:52.717] } [15:31:52.717] })) [15:31:52.717] }, error = function(ex) { [15:31:52.717] base::structure(base::list(value = NULL, visible = NULL, [15:31:52.717] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:52.717] ...future.rng), started = ...future.startTime, [15:31:52.717] finished = Sys.time(), session_uuid = NA_character_, [15:31:52.717] version = "1.8"), class = "FutureResult") [15:31:52.717] }, finally = { [15:31:52.717] if (!identical(...future.workdir, getwd())) [15:31:52.717] setwd(...future.workdir) [15:31:52.717] { [15:31:52.717] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:52.717] ...future.oldOptions$nwarnings <- NULL [15:31:52.717] } [15:31:52.717] base::options(...future.oldOptions) [15:31:52.717] if (.Platform$OS.type == "windows") { [15:31:52.717] old_names <- names(...future.oldEnvVars) [15:31:52.717] envs <- base::Sys.getenv() [15:31:52.717] names <- names(envs) [15:31:52.717] common <- intersect(names, old_names) [15:31:52.717] added <- setdiff(names, old_names) [15:31:52.717] removed <- setdiff(old_names, names) [15:31:52.717] changed <- common[...future.oldEnvVars[common] != [15:31:52.717] envs[common]] [15:31:52.717] NAMES <- toupper(changed) [15:31:52.717] args <- list() [15:31:52.717] for (kk in seq_along(NAMES)) { [15:31:52.717] name <- changed[[kk]] [15:31:52.717] NAME <- NAMES[[kk]] [15:31:52.717] if (name != NAME && is.element(NAME, old_names)) [15:31:52.717] next [15:31:52.717] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:52.717] } [15:31:52.717] NAMES <- toupper(added) [15:31:52.717] for (kk in seq_along(NAMES)) { [15:31:52.717] name <- added[[kk]] [15:31:52.717] NAME <- NAMES[[kk]] [15:31:52.717] if (name != NAME && is.element(NAME, old_names)) [15:31:52.717] next [15:31:52.717] args[[name]] <- "" [15:31:52.717] } [15:31:52.717] NAMES <- toupper(removed) [15:31:52.717] for (kk in seq_along(NAMES)) { [15:31:52.717] name <- removed[[kk]] [15:31:52.717] NAME <- NAMES[[kk]] [15:31:52.717] if (name != NAME && is.element(NAME, old_names)) [15:31:52.717] next [15:31:52.717] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:52.717] } [15:31:52.717] if (length(args) > 0) [15:31:52.717] base::do.call(base::Sys.setenv, args = args) [15:31:52.717] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:52.717] } [15:31:52.717] else { [15:31:52.717] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:52.717] } [15:31:52.717] { [15:31:52.717] if (base::length(...future.futureOptionsAdded) > [15:31:52.717] 0L) { [15:31:52.717] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:52.717] base::names(opts) <- ...future.futureOptionsAdded [15:31:52.717] base::options(opts) [15:31:52.717] } [15:31:52.717] { [15:31:52.717] { [15:31:52.717] NULL [15:31:52.717] RNGkind("Mersenne-Twister") [15:31:52.717] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:52.717] inherits = FALSE) [15:31:52.717] } [15:31:52.717] options(future.plan = NULL) [15:31:52.717] if (is.na(NA_character_)) [15:31:52.717] Sys.unsetenv("R_FUTURE_PLAN") [15:31:52.717] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:52.717] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:52.717] .init = FALSE) [15:31:52.717] } [15:31:52.717] } [15:31:52.717] } [15:31:52.717] }) [15:31:52.717] if (TRUE) { [15:31:52.717] base::sink(type = "output", split = FALSE) [15:31:52.717] if (TRUE) { [15:31:52.717] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:52.717] } [15:31:52.717] else { [15:31:52.717] ...future.result["stdout"] <- base::list(NULL) [15:31:52.717] } [15:31:52.717] base::close(...future.stdout) [15:31:52.717] ...future.stdout <- NULL [15:31:52.717] } [15:31:52.717] ...future.result$conditions <- ...future.conditions [15:31:52.717] ...future.result$finished <- base::Sys.time() [15:31:52.717] ...future.result [15:31:52.717] } [15:31:52.726] assign_globals() ... [15:31:52.726] List of 5 [15:31:52.726] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:52.726] $ future.call.arguments :List of 1 [15:31:52.726] ..$ length: int 2 [15:31:52.726] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.726] $ ...future.elements_ii :List of 4 [15:31:52.726] ..$ a: chr "integer" [15:31:52.726] ..$ b: chr "numeric" [15:31:52.726] ..$ c: chr "character" [15:31:52.726] ..$ c: chr "list" [15:31:52.726] $ ...future.seeds_ii : NULL [15:31:52.726] $ ...future.globals.maxSize: NULL [15:31:52.726] - attr(*, "where")=List of 5 [15:31:52.726] ..$ ...future.FUN : [15:31:52.726] ..$ future.call.arguments : [15:31:52.726] ..$ ...future.elements_ii : [15:31:52.726] ..$ ...future.seeds_ii : [15:31:52.726] ..$ ...future.globals.maxSize: [15:31:52.726] - attr(*, "resolved")= logi FALSE [15:31:52.726] - attr(*, "total_size")= num 2240 [15:31:52.726] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.726] - attr(*, "already-done")= logi TRUE [15:31:52.741] - copied '...future.FUN' to environment [15:31:52.741] - copied 'future.call.arguments' to environment [15:31:52.741] - copied '...future.elements_ii' to environment [15:31:52.742] - copied '...future.seeds_ii' to environment [15:31:52.742] - copied '...future.globals.maxSize' to environment [15:31:52.743] assign_globals() ... done [15:31:52.743] plan(): Setting new future strategy stack: [15:31:52.744] List of future strategies: [15:31:52.744] 1. sequential: [15:31:52.744] - args: function (..., envir = parent.frame(), workers = "") [15:31:52.744] - tweaked: FALSE [15:31:52.744] - call: NULL [15:31:52.750] plan(): nbrOfWorkers() = 1 [15:31:52.752] plan(): Setting new future strategy stack: [15:31:52.753] List of future strategies: [15:31:52.753] 1. sequential: [15:31:52.753] - args: function (..., envir = parent.frame(), workers = "") [15:31:52.753] - tweaked: FALSE [15:31:52.753] - call: plan(strategy) [15:31:52.754] plan(): nbrOfWorkers() = 1 [15:31:52.754] SequentialFuture started (and completed) [15:31:52.754] - Launch lazy future ... done [15:31:52.755] run() for 'SequentialFuture' ... done [15:31:52.755] Created future: [15:31:52.755] SequentialFuture: [15:31:52.755] Label: 'future_lapply-1' [15:31:52.755] Expression: [15:31:52.755] { [15:31:52.755] do.call(function(...) { [15:31:52.755] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.755] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:52.755] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.755] on.exit(options(oopts), add = TRUE) [15:31:52.755] } [15:31:52.755] { [15:31:52.755] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:52.755] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.755] ...future.FUN(...future.X_jj, ...) [15:31:52.755] }) [15:31:52.755] } [15:31:52.755] }, args = future.call.arguments) [15:31:52.755] } [15:31:52.755] Lazy evaluation: FALSE [15:31:52.755] Asynchronous evaluation: FALSE [15:31:52.755] Local evaluation: TRUE [15:31:52.755] Environment: R_GlobalEnv [15:31:52.755] Capture standard output: TRUE [15:31:52.755] Capture condition classes: 'condition' (excluding 'nothing') [15:31:52.755] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:52.755] Packages: [15:31:52.755] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:52.755] Resolved: TRUE [15:31:52.755] Value: 240 bytes of class 'list' [15:31:52.755] Early signaling: FALSE [15:31:52.755] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:52.755] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:52.757] Chunk #1 of 1 ... DONE [15:31:52.757] Launching 1 futures (chunks) ... DONE [15:31:52.758] Resolving 1 futures (chunks) ... [15:31:52.758] resolve() on list ... [15:31:52.758] recursive: 0 [15:31:52.758] length: 1 [15:31:52.758] [15:31:52.759] resolved() for 'SequentialFuture' ... [15:31:52.759] - state: 'finished' [15:31:52.759] - run: TRUE [15:31:52.759] - result: 'FutureResult' [15:31:52.760] resolved() for 'SequentialFuture' ... done [15:31:52.760] Future #1 [15:31:52.760] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:52.761] - nx: 1 [15:31:52.761] - relay: TRUE [15:31:52.761] - stdout: TRUE [15:31:52.761] - signal: TRUE [15:31:52.762] - resignal: FALSE [15:31:52.762] - force: TRUE [15:31:52.762] - relayed: [n=1] FALSE [15:31:52.762] - queued futures: [n=1] FALSE [15:31:52.762] - until=1 [15:31:52.763] - relaying element #1 [15:31:52.763] - relayed: [n=1] TRUE [15:31:52.763] - queued futures: [n=1] TRUE [15:31:52.764] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:52.764] length: 0 (resolved future 1) [15:31:52.764] Relaying remaining futures [15:31:52.764] signalConditionsASAP(NULL, pos=0) ... [15:31:52.764] - nx: 1 [15:31:52.765] - relay: TRUE [15:31:52.765] - stdout: TRUE [15:31:52.765] - signal: TRUE [15:31:52.765] - resignal: FALSE [15:31:52.766] - force: TRUE [15:31:52.766] - relayed: [n=1] TRUE [15:31:52.766] - queued futures: [n=1] TRUE - flush all [15:31:52.766] - relayed: [n=1] TRUE [15:31:52.767] - queued futures: [n=1] TRUE [15:31:52.767] signalConditionsASAP(NULL, pos=0) ... done [15:31:52.767] resolve() on list ... DONE [15:31:52.771] - Number of value chunks collected: 1 [15:31:52.771] Resolving 1 futures (chunks) ... DONE [15:31:52.772] Reducing values from 1 chunks ... [15:31:52.772] - Number of values collected after concatenation: 4 [15:31:52.772] - Number of values expected: 4 [15:31:52.772] Reducing values from 1 chunks ... DONE [15:31:52.773] 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, ...) ... [15:31:52.777] future_lapply() ... [15:31:52.789] Number of chunks: 1 [15:31:52.789] getGlobalsAndPackagesXApply() ... [15:31:52.789] - future.globals: TRUE [15:31:52.789] getGlobalsAndPackages() ... [15:31:52.789] Searching for globals... [15:31:52.803] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [15:31:52.803] Searching for globals ... DONE [15:31:52.804] Resolving globals: FALSE [15:31:52.805] The total size of the 1 globals is 69.62 KiB (71288 bytes) [15:31:52.806] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 69.62 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (69.62 KiB of class 'function') [15:31:52.806] - globals: [1] 'FUN' [15:31:52.806] - packages: [1] 'future' [15:31:52.806] getGlobalsAndPackages() ... DONE [15:31:52.807] - globals found/used: [n=1] 'FUN' [15:31:52.807] - needed namespaces: [n=1] 'future' [15:31:52.807] Finding globals ... DONE [15:31:52.807] - use_args: TRUE [15:31:52.808] - Getting '...' globals ... [15:31:52.808] resolve() on list ... [15:31:52.808] recursive: 0 [15:31:52.809] length: 1 [15:31:52.809] elements: '...' [15:31:52.809] length: 0 (resolved future 1) [15:31:52.809] resolve() on list ... DONE [15:31:52.810] - '...' content: [n=2] 'collapse', 'maxHead' [15:31:52.810] List of 1 [15:31:52.810] $ ...:List of 2 [15:31:52.810] ..$ collapse: chr "; " [15:31:52.810] ..$ maxHead : int 3 [15:31:52.810] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.810] - attr(*, "where")=List of 1 [15:31:52.810] ..$ ...: [15:31:52.810] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.810] - attr(*, "resolved")= logi TRUE [15:31:52.810] - attr(*, "total_size")= num NA [15:31:52.814] - Getting '...' globals ... DONE [15:31:52.815] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:52.815] List of 2 [15:31:52.815] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:52.815] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:52.815] $ ... :List of 2 [15:31:52.815] ..$ collapse: chr "; " [15:31:52.815] ..$ maxHead : int 3 [15:31:52.815] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.815] - attr(*, "where")=List of 2 [15:31:52.815] ..$ ...future.FUN: [15:31:52.815] ..$ ... : [15:31:52.815] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.815] - attr(*, "resolved")= logi FALSE [15:31:52.815] - attr(*, "total_size")= num 71456 [15:31:52.819] Packages to be attached in all futures: [n=1] 'future' [15:31:52.819] getGlobalsAndPackagesXApply() ... DONE [15:31:52.820] Number of futures (= number of chunks): 1 [15:31:52.820] Launching 1 futures (chunks) ... [15:31:52.820] Chunk #1 of 1 ... [15:31:52.820] - Finding globals in 'X' for chunk #1 ... [15:31:52.820] getGlobalsAndPackages() ... [15:31:52.821] Searching for globals... [15:31:52.821] [15:31:52.821] Searching for globals ... DONE [15:31:52.821] - globals: [0] [15:31:52.821] getGlobalsAndPackages() ... DONE [15:31:52.822] + additional globals found: [n=0] [15:31:52.822] + additional namespaces needed: [n=0] [15:31:52.822] - Finding globals in 'X' for chunk #1 ... DONE [15:31:52.822] - seeds: [15:31:52.822] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.822] getGlobalsAndPackages() ... [15:31:52.823] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.823] Resolving globals: FALSE [15:31:52.823] Tweak future expression to call with '...' arguments ... [15:31:52.823] { [15:31:52.823] do.call(function(...) { [15:31:52.823] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.823] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:52.823] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.823] on.exit(options(oopts), add = TRUE) [15:31:52.823] } [15:31:52.823] { [15:31:52.823] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:52.823] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.823] ...future.FUN(...future.X_jj, ...) [15:31:52.823] }) [15:31:52.823] } [15:31:52.823] }, args = future.call.arguments) [15:31:52.823] } [15:31:52.824] Tweak future expression to call with '...' arguments ... DONE [15:31:52.824] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.824] - packages: [1] 'future' [15:31:52.825] getGlobalsAndPackages() ... DONE [15:31:52.825] run() for 'Future' ... [15:31:52.825] - state: 'created' [15:31:52.825] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:52.826] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:52.826] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:52.826] - Field: 'label' [15:31:52.826] - Field: 'local' [15:31:52.827] - Field: 'owner' [15:31:52.827] - Field: 'envir' [15:31:52.827] - Field: 'packages' [15:31:52.827] - Field: 'gc' [15:31:52.827] - Field: 'conditions' [15:31:52.827] - Field: 'expr' [15:31:52.828] - Field: 'uuid' [15:31:52.828] - Field: 'seed' [15:31:52.828] - Field: 'version' [15:31:52.828] - Field: 'result' [15:31:52.828] - Field: 'asynchronous' [15:31:52.829] - Field: 'calls' [15:31:52.829] - Field: 'globals' [15:31:52.829] - Field: 'stdout' [15:31:52.829] - Field: 'earlySignal' [15:31:52.829] - Field: 'lazy' [15:31:52.829] - Field: 'state' [15:31:52.830] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:52.830] - Launch lazy future ... [15:31:52.830] Packages needed by the future expression (n = 1): 'future' [15:31:52.830] Packages needed by future strategies (n = 0): [15:31:52.831] { [15:31:52.831] { [15:31:52.831] { [15:31:52.831] ...future.startTime <- base::Sys.time() [15:31:52.831] { [15:31:52.831] { [15:31:52.831] { [15:31:52.831] { [15:31:52.831] base::local({ [15:31:52.831] has_future <- base::requireNamespace("future", [15:31:52.831] quietly = TRUE) [15:31:52.831] if (has_future) { [15:31:52.831] ns <- base::getNamespace("future") [15:31:52.831] version <- ns[[".package"]][["version"]] [15:31:52.831] if (is.null(version)) [15:31:52.831] version <- utils::packageVersion("future") [15:31:52.831] } [15:31:52.831] else { [15:31:52.831] version <- NULL [15:31:52.831] } [15:31:52.831] if (!has_future || version < "1.8.0") { [15:31:52.831] info <- base::c(r_version = base::gsub("R version ", [15:31:52.831] "", base::R.version$version.string), [15:31:52.831] platform = base::sprintf("%s (%s-bit)", [15:31:52.831] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:52.831] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:52.831] "release", "version")], collapse = " "), [15:31:52.831] hostname = base::Sys.info()[["nodename"]]) [15:31:52.831] info <- base::sprintf("%s: %s", base::names(info), [15:31:52.831] info) [15:31:52.831] info <- base::paste(info, collapse = "; ") [15:31:52.831] if (!has_future) { [15:31:52.831] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:52.831] info) [15:31:52.831] } [15:31:52.831] else { [15:31:52.831] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:52.831] info, version) [15:31:52.831] } [15:31:52.831] base::stop(msg) [15:31:52.831] } [15:31:52.831] }) [15:31:52.831] } [15:31:52.831] base::local({ [15:31:52.831] for (pkg in "future") { [15:31:52.831] base::loadNamespace(pkg) [15:31:52.831] base::library(pkg, character.only = TRUE) [15:31:52.831] } [15:31:52.831] }) [15:31:52.831] } [15:31:52.831] ...future.strategy.old <- future::plan("list") [15:31:52.831] options(future.plan = NULL) [15:31:52.831] Sys.unsetenv("R_FUTURE_PLAN") [15:31:52.831] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:52.831] } [15:31:52.831] ...future.workdir <- getwd() [15:31:52.831] } [15:31:52.831] ...future.oldOptions <- base::as.list(base::.Options) [15:31:52.831] ...future.oldEnvVars <- base::Sys.getenv() [15:31:52.831] } [15:31:52.831] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:52.831] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:52.831] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:52.831] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:52.831] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:52.831] future.stdout.windows.reencode = NULL, width = 80L) [15:31:52.831] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:52.831] base::names(...future.oldOptions)) [15:31:52.831] } [15:31:52.831] if (FALSE) { [15:31:52.831] } [15:31:52.831] else { [15:31:52.831] if (TRUE) { [15:31:52.831] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:52.831] open = "w") [15:31:52.831] } [15:31:52.831] else { [15:31:52.831] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:52.831] windows = "NUL", "/dev/null"), open = "w") [15:31:52.831] } [15:31:52.831] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:52.831] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:52.831] base::sink(type = "output", split = FALSE) [15:31:52.831] base::close(...future.stdout) [15:31:52.831] }, add = TRUE) [15:31:52.831] } [15:31:52.831] ...future.frame <- base::sys.nframe() [15:31:52.831] ...future.conditions <- base::list() [15:31:52.831] ...future.rng <- base::globalenv()$.Random.seed [15:31:52.831] if (FALSE) { [15:31:52.831] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:52.831] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:52.831] } [15:31:52.831] ...future.result <- base::tryCatch({ [15:31:52.831] base::withCallingHandlers({ [15:31:52.831] ...future.value <- base::withVisible(base::local({ [15:31:52.831] do.call(function(...) { [15:31:52.831] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.831] if (!identical(...future.globals.maxSize.org, [15:31:52.831] ...future.globals.maxSize)) { [15:31:52.831] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.831] on.exit(options(oopts), add = TRUE) [15:31:52.831] } [15:31:52.831] { [15:31:52.831] lapply(seq_along(...future.elements_ii), [15:31:52.831] FUN = function(jj) { [15:31:52.831] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.831] ...future.FUN(...future.X_jj, ...) [15:31:52.831] }) [15:31:52.831] } [15:31:52.831] }, args = future.call.arguments) [15:31:52.831] })) [15:31:52.831] future::FutureResult(value = ...future.value$value, [15:31:52.831] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:52.831] ...future.rng), globalenv = if (FALSE) [15:31:52.831] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:52.831] ...future.globalenv.names)) [15:31:52.831] else NULL, started = ...future.startTime, version = "1.8") [15:31:52.831] }, condition = base::local({ [15:31:52.831] c <- base::c [15:31:52.831] inherits <- base::inherits [15:31:52.831] invokeRestart <- base::invokeRestart [15:31:52.831] length <- base::length [15:31:52.831] list <- base::list [15:31:52.831] seq.int <- base::seq.int [15:31:52.831] signalCondition <- base::signalCondition [15:31:52.831] sys.calls <- base::sys.calls [15:31:52.831] `[[` <- base::`[[` [15:31:52.831] `+` <- base::`+` [15:31:52.831] `<<-` <- base::`<<-` [15:31:52.831] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:52.831] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:52.831] 3L)] [15:31:52.831] } [15:31:52.831] function(cond) { [15:31:52.831] is_error <- inherits(cond, "error") [15:31:52.831] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:52.831] NULL) [15:31:52.831] if (is_error) { [15:31:52.831] sessionInformation <- function() { [15:31:52.831] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:52.831] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:52.831] search = base::search(), system = base::Sys.info()) [15:31:52.831] } [15:31:52.831] ...future.conditions[[length(...future.conditions) + [15:31:52.831] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:52.831] cond$call), session = sessionInformation(), [15:31:52.831] timestamp = base::Sys.time(), signaled = 0L) [15:31:52.831] signalCondition(cond) [15:31:52.831] } [15:31:52.831] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:52.831] "immediateCondition"))) { [15:31:52.831] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:52.831] ...future.conditions[[length(...future.conditions) + [15:31:52.831] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:52.831] if (TRUE && !signal) { [15:31:52.831] muffleCondition <- function (cond, pattern = "^muffle") [15:31:52.831] { [15:31:52.831] inherits <- base::inherits [15:31:52.831] invokeRestart <- base::invokeRestart [15:31:52.831] is.null <- base::is.null [15:31:52.831] muffled <- FALSE [15:31:52.831] if (inherits(cond, "message")) { [15:31:52.831] muffled <- grepl(pattern, "muffleMessage") [15:31:52.831] if (muffled) [15:31:52.831] invokeRestart("muffleMessage") [15:31:52.831] } [15:31:52.831] else if (inherits(cond, "warning")) { [15:31:52.831] muffled <- grepl(pattern, "muffleWarning") [15:31:52.831] if (muffled) [15:31:52.831] invokeRestart("muffleWarning") [15:31:52.831] } [15:31:52.831] else if (inherits(cond, "condition")) { [15:31:52.831] if (!is.null(pattern)) { [15:31:52.831] computeRestarts <- base::computeRestarts [15:31:52.831] grepl <- base::grepl [15:31:52.831] restarts <- computeRestarts(cond) [15:31:52.831] for (restart in restarts) { [15:31:52.831] name <- restart$name [15:31:52.831] if (is.null(name)) [15:31:52.831] next [15:31:52.831] if (!grepl(pattern, name)) [15:31:52.831] next [15:31:52.831] invokeRestart(restart) [15:31:52.831] muffled <- TRUE [15:31:52.831] break [15:31:52.831] } [15:31:52.831] } [15:31:52.831] } [15:31:52.831] invisible(muffled) [15:31:52.831] } [15:31:52.831] muffleCondition(cond, pattern = "^muffle") [15:31:52.831] } [15:31:52.831] } [15:31:52.831] else { [15:31:52.831] if (TRUE) { [15:31:52.831] muffleCondition <- function (cond, pattern = "^muffle") [15:31:52.831] { [15:31:52.831] inherits <- base::inherits [15:31:52.831] invokeRestart <- base::invokeRestart [15:31:52.831] is.null <- base::is.null [15:31:52.831] muffled <- FALSE [15:31:52.831] if (inherits(cond, "message")) { [15:31:52.831] muffled <- grepl(pattern, "muffleMessage") [15:31:52.831] if (muffled) [15:31:52.831] invokeRestart("muffleMessage") [15:31:52.831] } [15:31:52.831] else if (inherits(cond, "warning")) { [15:31:52.831] muffled <- grepl(pattern, "muffleWarning") [15:31:52.831] if (muffled) [15:31:52.831] invokeRestart("muffleWarning") [15:31:52.831] } [15:31:52.831] else if (inherits(cond, "condition")) { [15:31:52.831] if (!is.null(pattern)) { [15:31:52.831] computeRestarts <- base::computeRestarts [15:31:52.831] grepl <- base::grepl [15:31:52.831] restarts <- computeRestarts(cond) [15:31:52.831] for (restart in restarts) { [15:31:52.831] name <- restart$name [15:31:52.831] if (is.null(name)) [15:31:52.831] next [15:31:52.831] if (!grepl(pattern, name)) [15:31:52.831] next [15:31:52.831] invokeRestart(restart) [15:31:52.831] muffled <- TRUE [15:31:52.831] break [15:31:52.831] } [15:31:52.831] } [15:31:52.831] } [15:31:52.831] invisible(muffled) [15:31:52.831] } [15:31:52.831] muffleCondition(cond, pattern = "^muffle") [15:31:52.831] } [15:31:52.831] } [15:31:52.831] } [15:31:52.831] })) [15:31:52.831] }, error = function(ex) { [15:31:52.831] base::structure(base::list(value = NULL, visible = NULL, [15:31:52.831] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:52.831] ...future.rng), started = ...future.startTime, [15:31:52.831] finished = Sys.time(), session_uuid = NA_character_, [15:31:52.831] version = "1.8"), class = "FutureResult") [15:31:52.831] }, finally = { [15:31:52.831] if (!identical(...future.workdir, getwd())) [15:31:52.831] setwd(...future.workdir) [15:31:52.831] { [15:31:52.831] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:52.831] ...future.oldOptions$nwarnings <- NULL [15:31:52.831] } [15:31:52.831] base::options(...future.oldOptions) [15:31:52.831] if (.Platform$OS.type == "windows") { [15:31:52.831] old_names <- names(...future.oldEnvVars) [15:31:52.831] envs <- base::Sys.getenv() [15:31:52.831] names <- names(envs) [15:31:52.831] common <- intersect(names, old_names) [15:31:52.831] added <- setdiff(names, old_names) [15:31:52.831] removed <- setdiff(old_names, names) [15:31:52.831] changed <- common[...future.oldEnvVars[common] != [15:31:52.831] envs[common]] [15:31:52.831] NAMES <- toupper(changed) [15:31:52.831] args <- list() [15:31:52.831] for (kk in seq_along(NAMES)) { [15:31:52.831] name <- changed[[kk]] [15:31:52.831] NAME <- NAMES[[kk]] [15:31:52.831] if (name != NAME && is.element(NAME, old_names)) [15:31:52.831] next [15:31:52.831] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:52.831] } [15:31:52.831] NAMES <- toupper(added) [15:31:52.831] for (kk in seq_along(NAMES)) { [15:31:52.831] name <- added[[kk]] [15:31:52.831] NAME <- NAMES[[kk]] [15:31:52.831] if (name != NAME && is.element(NAME, old_names)) [15:31:52.831] next [15:31:52.831] args[[name]] <- "" [15:31:52.831] } [15:31:52.831] NAMES <- toupper(removed) [15:31:52.831] for (kk in seq_along(NAMES)) { [15:31:52.831] name <- removed[[kk]] [15:31:52.831] NAME <- NAMES[[kk]] [15:31:52.831] if (name != NAME && is.element(NAME, old_names)) [15:31:52.831] next [15:31:52.831] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:52.831] } [15:31:52.831] if (length(args) > 0) [15:31:52.831] base::do.call(base::Sys.setenv, args = args) [15:31:52.831] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:52.831] } [15:31:52.831] else { [15:31:52.831] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:52.831] } [15:31:52.831] { [15:31:52.831] if (base::length(...future.futureOptionsAdded) > [15:31:52.831] 0L) { [15:31:52.831] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:52.831] base::names(opts) <- ...future.futureOptionsAdded [15:31:52.831] base::options(opts) [15:31:52.831] } [15:31:52.831] { [15:31:52.831] { [15:31:52.831] NULL [15:31:52.831] RNGkind("Mersenne-Twister") [15:31:52.831] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:52.831] inherits = FALSE) [15:31:52.831] } [15:31:52.831] options(future.plan = NULL) [15:31:52.831] if (is.na(NA_character_)) [15:31:52.831] Sys.unsetenv("R_FUTURE_PLAN") [15:31:52.831] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:52.831] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:52.831] .init = FALSE) [15:31:52.831] } [15:31:52.831] } [15:31:52.831] } [15:31:52.831] }) [15:31:52.831] if (TRUE) { [15:31:52.831] base::sink(type = "output", split = FALSE) [15:31:52.831] if (TRUE) { [15:31:52.831] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:52.831] } [15:31:52.831] else { [15:31:52.831] ...future.result["stdout"] <- base::list(NULL) [15:31:52.831] } [15:31:52.831] base::close(...future.stdout) [15:31:52.831] ...future.stdout <- NULL [15:31:52.831] } [15:31:52.831] ...future.result$conditions <- ...future.conditions [15:31:52.831] ...future.result$finished <- base::Sys.time() [15:31:52.831] ...future.result [15:31:52.831] } [15:31:52.835] assign_globals() ... [15:31:52.835] List of 5 [15:31:52.835] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:52.835] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:52.835] $ future.call.arguments :List of 2 [15:31:52.835] ..$ collapse: chr "; " [15:31:52.835] ..$ maxHead : int 3 [15:31:52.835] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.835] $ ...future.elements_ii :List of 1 [15:31:52.835] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [15:31:52.835] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [15:31:52.835] $ ...future.seeds_ii : NULL [15:31:52.835] $ ...future.globals.maxSize: NULL [15:31:52.835] - attr(*, "where")=List of 5 [15:31:52.835] ..$ ...future.FUN : [15:31:52.835] ..$ future.call.arguments : [15:31:52.835] ..$ ...future.elements_ii : [15:31:52.835] ..$ ...future.seeds_ii : [15:31:52.835] ..$ ...future.globals.maxSize: [15:31:52.835] - attr(*, "resolved")= logi FALSE [15:31:52.835] - attr(*, "total_size")= num 71456 [15:31:52.835] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.835] - attr(*, "already-done")= logi TRUE [15:31:52.842] - copied '...future.FUN' to environment [15:31:52.843] - copied 'future.call.arguments' to environment [15:31:52.843] - copied '...future.elements_ii' to environment [15:31:52.843] - copied '...future.seeds_ii' to environment [15:31:52.843] - copied '...future.globals.maxSize' to environment [15:31:52.844] assign_globals() ... done [15:31:52.844] plan(): Setting new future strategy stack: [15:31:52.844] List of future strategies: [15:31:52.844] 1. sequential: [15:31:52.844] - args: function (..., envir = parent.frame(), workers = "") [15:31:52.844] - tweaked: FALSE [15:31:52.844] - call: NULL [15:31:52.845] plan(): nbrOfWorkers() = 1 [15:31:52.846] plan(): Setting new future strategy stack: [15:31:52.847] List of future strategies: [15:31:52.847] 1. sequential: [15:31:52.847] - args: function (..., envir = parent.frame(), workers = "") [15:31:52.847] - tweaked: FALSE [15:31:52.847] - call: plan(strategy) [15:31:52.847] plan(): nbrOfWorkers() = 1 [15:31:52.848] SequentialFuture started (and completed) [15:31:52.848] - Launch lazy future ... done [15:31:52.848] run() for 'SequentialFuture' ... done [15:31:52.848] Created future: [15:31:52.848] SequentialFuture: [15:31:52.848] Label: 'future_lapply-1' [15:31:52.848] Expression: [15:31:52.848] { [15:31:52.848] do.call(function(...) { [15:31:52.848] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.848] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:52.848] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.848] on.exit(options(oopts), add = TRUE) [15:31:52.848] } [15:31:52.848] { [15:31:52.848] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:52.848] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.848] ...future.FUN(...future.X_jj, ...) [15:31:52.848] }) [15:31:52.848] } [15:31:52.848] }, args = future.call.arguments) [15:31:52.848] } [15:31:52.848] Lazy evaluation: FALSE [15:31:52.848] Asynchronous evaluation: FALSE [15:31:52.848] Local evaluation: TRUE [15:31:52.848] Environment: R_GlobalEnv [15:31:52.848] Capture standard output: TRUE [15:31:52.848] Capture condition classes: 'condition' (excluding 'nothing') [15:31:52.848] Globals: 5 objects totaling 82.61 KiB (function '...future.FUN' of 69.62 KiB, DotDotDotList 'future.call.arguments' of 168 bytes, list '...future.elements_ii' of 12.83 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:52.848] Packages: 1 packages ('future') [15:31:52.848] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:52.848] Resolved: TRUE [15:31:52.848] Value: 136 bytes of class 'list' [15:31:52.848] Early signaling: FALSE [15:31:52.848] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:52.848] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:52.850] Chunk #1 of 1 ... DONE [15:31:52.850] Launching 1 futures (chunks) ... DONE [15:31:52.850] Resolving 1 futures (chunks) ... [15:31:52.850] resolve() on list ... [15:31:52.851] recursive: 0 [15:31:52.851] length: 1 [15:31:52.851] [15:31:52.851] resolved() for 'SequentialFuture' ... [15:31:52.851] - state: 'finished' [15:31:52.851] - run: TRUE [15:31:52.852] - result: 'FutureResult' [15:31:52.852] resolved() for 'SequentialFuture' ... done [15:31:52.852] Future #1 [15:31:52.852] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:52.852] - nx: 1 [15:31:52.853] - relay: TRUE [15:31:52.853] - stdout: TRUE [15:31:52.853] - signal: TRUE [15:31:52.853] - resignal: FALSE [15:31:52.853] - force: TRUE [15:31:52.853] - relayed: [n=1] FALSE [15:31:52.854] - queued futures: [n=1] FALSE [15:31:52.854] - until=1 [15:31:52.854] - relaying element #1 [15:31:52.854] - relayed: [n=1] TRUE [15:31:52.854] - queued futures: [n=1] TRUE [15:31:52.855] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:52.855] length: 0 (resolved future 1) [15:31:52.855] Relaying remaining futures [15:31:52.855] signalConditionsASAP(NULL, pos=0) ... [15:31:52.855] - nx: 1 [15:31:52.855] - relay: TRUE [15:31:52.856] - stdout: TRUE [15:31:52.856] - signal: TRUE [15:31:52.856] - resignal: FALSE [15:31:52.856] - force: TRUE [15:31:52.856] - relayed: [n=1] TRUE [15:31:52.856] - queued futures: [n=1] TRUE - flush all [15:31:52.857] - relayed: [n=1] TRUE [15:31:52.857] - queued futures: [n=1] TRUE [15:31:52.857] signalConditionsASAP(NULL, pos=0) ... done [15:31:52.857] resolve() on list ... DONE [15:31:52.857] - Number of value chunks collected: 1 [15:31:52.858] Resolving 1 futures (chunks) ... DONE [15:31:52.858] Reducing values from 1 chunks ... [15:31:52.858] - Number of values collected after concatenation: 1 [15:31:52.858] - Number of values expected: 1 [15:31:52.859] Reducing values from 1 chunks ... DONE [15:31:52.859] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [15:31:52.862] future_lapply() ... [15:31:52.863] Number of chunks: 1 [15:31:52.863] getGlobalsAndPackagesXApply() ... [15:31:52.864] - future.globals: TRUE [15:31:52.864] getGlobalsAndPackages() ... [15:31:52.864] Searching for globals... [15:31:52.867] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [15:31:52.867] Searching for globals ... DONE [15:31:52.867] Resolving globals: FALSE [15:31:52.868] The total size of the 1 globals is 4.85 KiB (4968 bytes) [15:31:52.869] The total size of the 1 globals exported for future expression ('FUN()') is 4.85 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (4.85 KiB of class 'function') [15:31:52.869] - globals: [1] 'FUN' [15:31:52.870] - packages: [1] 'listenv' [15:31:52.870] getGlobalsAndPackages() ... DONE [15:31:52.870] - globals found/used: [n=1] 'FUN' [15:31:52.870] - needed namespaces: [n=1] 'listenv' [15:31:52.871] Finding globals ... DONE [15:31:52.871] - use_args: TRUE [15:31:52.871] - Getting '...' globals ... [15:31:52.872] resolve() on list ... [15:31:52.872] recursive: 0 [15:31:52.873] length: 1 [15:31:52.873] elements: '...' [15:31:52.873] length: 0 (resolved future 1) [15:31:52.873] resolve() on list ... DONE [15:31:52.874] - '...' content: [n=0] [15:31:52.874] List of 1 [15:31:52.874] $ ...: list() [15:31:52.874] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.874] - attr(*, "where")=List of 1 [15:31:52.874] ..$ ...: [15:31:52.874] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.874] - attr(*, "resolved")= logi TRUE [15:31:52.874] - attr(*, "total_size")= num NA [15:31:52.879] - Getting '...' globals ... DONE [15:31:52.880] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:52.880] List of 2 [15:31:52.880] $ ...future.FUN:function (x, ...) [15:31:52.880] $ ... : list() [15:31:52.880] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.880] - attr(*, "where")=List of 2 [15:31:52.880] ..$ ...future.FUN: [15:31:52.880] ..$ ... : [15:31:52.880] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.880] - attr(*, "resolved")= logi FALSE [15:31:52.880] - attr(*, "total_size")= num 4968 [15:31:52.885] Packages to be attached in all futures: [n=1] 'listenv' [15:31:52.886] getGlobalsAndPackagesXApply() ... DONE [15:31:52.886] Number of futures (= number of chunks): 1 [15:31:52.887] Launching 1 futures (chunks) ... [15:31:52.887] Chunk #1 of 1 ... [15:31:52.887] - Finding globals in 'X' for chunk #1 ... [15:31:52.887] getGlobalsAndPackages() ... [15:31:52.888] Searching for globals... [15:31:52.889] [15:31:52.889] Searching for globals ... DONE [15:31:52.890] - globals: [0] [15:31:52.890] getGlobalsAndPackages() ... DONE [15:31:52.890] + additional globals found: [n=0] [15:31:52.890] + additional namespaces needed: [n=0] [15:31:52.895] - Finding globals in 'X' for chunk #1 ... DONE [15:31:52.895] - seeds: [15:31:52.895] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.896] getGlobalsAndPackages() ... [15:31:52.896] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.896] Resolving globals: FALSE [15:31:52.897] Tweak future expression to call with '...' arguments ... [15:31:52.897] { [15:31:52.897] do.call(function(...) { [15:31:52.897] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.897] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:52.897] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.897] on.exit(options(oopts), add = TRUE) [15:31:52.897] } [15:31:52.897] { [15:31:52.897] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:52.897] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.897] ...future.FUN(...future.X_jj, ...) [15:31:52.897] }) [15:31:52.897] } [15:31:52.897] }, args = future.call.arguments) [15:31:52.897] } [15:31:52.898] Tweak future expression to call with '...' arguments ... DONE [15:31:52.899] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.899] - packages: [1] 'listenv' [15:31:52.899] getGlobalsAndPackages() ... DONE [15:31:52.900] run() for 'Future' ... [15:31:52.900] - state: 'created' [15:31:52.901] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:52.901] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:52.902] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:52.902] - Field: 'label' [15:31:52.902] - Field: 'local' [15:31:52.903] - Field: 'owner' [15:31:52.903] - Field: 'envir' [15:31:52.903] - Field: 'packages' [15:31:52.904] - Field: 'gc' [15:31:52.904] - Field: 'conditions' [15:31:52.904] - Field: 'expr' [15:31:52.904] - Field: 'uuid' [15:31:52.905] - Field: 'seed' [15:31:52.905] - Field: 'version' [15:31:52.905] - Field: 'result' [15:31:52.906] - Field: 'asynchronous' [15:31:52.906] - Field: 'calls' [15:31:52.906] - Field: 'globals' [15:31:52.907] - Field: 'stdout' [15:31:52.907] - Field: 'earlySignal' [15:31:52.907] - Field: 'lazy' [15:31:52.907] - Field: 'state' [15:31:52.908] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:52.908] - Launch lazy future ... [15:31:52.908] Packages needed by the future expression (n = 1): 'listenv' [15:31:52.909] Packages needed by future strategies (n = 0): [15:31:52.910] { [15:31:52.910] { [15:31:52.910] { [15:31:52.910] ...future.startTime <- base::Sys.time() [15:31:52.910] { [15:31:52.910] { [15:31:52.910] { [15:31:52.910] { [15:31:52.910] base::local({ [15:31:52.910] has_future <- base::requireNamespace("future", [15:31:52.910] quietly = TRUE) [15:31:52.910] if (has_future) { [15:31:52.910] ns <- base::getNamespace("future") [15:31:52.910] version <- ns[[".package"]][["version"]] [15:31:52.910] if (is.null(version)) [15:31:52.910] version <- utils::packageVersion("future") [15:31:52.910] } [15:31:52.910] else { [15:31:52.910] version <- NULL [15:31:52.910] } [15:31:52.910] if (!has_future || version < "1.8.0") { [15:31:52.910] info <- base::c(r_version = base::gsub("R version ", [15:31:52.910] "", base::R.version$version.string), [15:31:52.910] platform = base::sprintf("%s (%s-bit)", [15:31:52.910] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:52.910] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:52.910] "release", "version")], collapse = " "), [15:31:52.910] hostname = base::Sys.info()[["nodename"]]) [15:31:52.910] info <- base::sprintf("%s: %s", base::names(info), [15:31:52.910] info) [15:31:52.910] info <- base::paste(info, collapse = "; ") [15:31:52.910] if (!has_future) { [15:31:52.910] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:52.910] info) [15:31:52.910] } [15:31:52.910] else { [15:31:52.910] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:52.910] info, version) [15:31:52.910] } [15:31:52.910] base::stop(msg) [15:31:52.910] } [15:31:52.910] }) [15:31:52.910] } [15:31:52.910] base::local({ [15:31:52.910] for (pkg in "listenv") { [15:31:52.910] base::loadNamespace(pkg) [15:31:52.910] base::library(pkg, character.only = TRUE) [15:31:52.910] } [15:31:52.910] }) [15:31:52.910] } [15:31:52.910] ...future.strategy.old <- future::plan("list") [15:31:52.910] options(future.plan = NULL) [15:31:52.910] Sys.unsetenv("R_FUTURE_PLAN") [15:31:52.910] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:52.910] } [15:31:52.910] ...future.workdir <- getwd() [15:31:52.910] } [15:31:52.910] ...future.oldOptions <- base::as.list(base::.Options) [15:31:52.910] ...future.oldEnvVars <- base::Sys.getenv() [15:31:52.910] } [15:31:52.910] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:52.910] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:52.910] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:52.910] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:52.910] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:52.910] future.stdout.windows.reencode = NULL, width = 80L) [15:31:52.910] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:52.910] base::names(...future.oldOptions)) [15:31:52.910] } [15:31:52.910] if (FALSE) { [15:31:52.910] } [15:31:52.910] else { [15:31:52.910] if (TRUE) { [15:31:52.910] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:52.910] open = "w") [15:31:52.910] } [15:31:52.910] else { [15:31:52.910] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:52.910] windows = "NUL", "/dev/null"), open = "w") [15:31:52.910] } [15:31:52.910] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:52.910] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:52.910] base::sink(type = "output", split = FALSE) [15:31:52.910] base::close(...future.stdout) [15:31:52.910] }, add = TRUE) [15:31:52.910] } [15:31:52.910] ...future.frame <- base::sys.nframe() [15:31:52.910] ...future.conditions <- base::list() [15:31:52.910] ...future.rng <- base::globalenv()$.Random.seed [15:31:52.910] if (FALSE) { [15:31:52.910] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:52.910] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:52.910] } [15:31:52.910] ...future.result <- base::tryCatch({ [15:31:52.910] base::withCallingHandlers({ [15:31:52.910] ...future.value <- base::withVisible(base::local({ [15:31:52.910] do.call(function(...) { [15:31:52.910] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.910] if (!identical(...future.globals.maxSize.org, [15:31:52.910] ...future.globals.maxSize)) { [15:31:52.910] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.910] on.exit(options(oopts), add = TRUE) [15:31:52.910] } [15:31:52.910] { [15:31:52.910] lapply(seq_along(...future.elements_ii), [15:31:52.910] FUN = function(jj) { [15:31:52.910] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.910] ...future.FUN(...future.X_jj, ...) [15:31:52.910] }) [15:31:52.910] } [15:31:52.910] }, args = future.call.arguments) [15:31:52.910] })) [15:31:52.910] future::FutureResult(value = ...future.value$value, [15:31:52.910] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:52.910] ...future.rng), globalenv = if (FALSE) [15:31:52.910] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:52.910] ...future.globalenv.names)) [15:31:52.910] else NULL, started = ...future.startTime, version = "1.8") [15:31:52.910] }, condition = base::local({ [15:31:52.910] c <- base::c [15:31:52.910] inherits <- base::inherits [15:31:52.910] invokeRestart <- base::invokeRestart [15:31:52.910] length <- base::length [15:31:52.910] list <- base::list [15:31:52.910] seq.int <- base::seq.int [15:31:52.910] signalCondition <- base::signalCondition [15:31:52.910] sys.calls <- base::sys.calls [15:31:52.910] `[[` <- base::`[[` [15:31:52.910] `+` <- base::`+` [15:31:52.910] `<<-` <- base::`<<-` [15:31:52.910] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:52.910] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:52.910] 3L)] [15:31:52.910] } [15:31:52.910] function(cond) { [15:31:52.910] is_error <- inherits(cond, "error") [15:31:52.910] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:52.910] NULL) [15:31:52.910] if (is_error) { [15:31:52.910] sessionInformation <- function() { [15:31:52.910] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:52.910] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:52.910] search = base::search(), system = base::Sys.info()) [15:31:52.910] } [15:31:52.910] ...future.conditions[[length(...future.conditions) + [15:31:52.910] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:52.910] cond$call), session = sessionInformation(), [15:31:52.910] timestamp = base::Sys.time(), signaled = 0L) [15:31:52.910] signalCondition(cond) [15:31:52.910] } [15:31:52.910] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:52.910] "immediateCondition"))) { [15:31:52.910] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:52.910] ...future.conditions[[length(...future.conditions) + [15:31:52.910] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:52.910] if (TRUE && !signal) { [15:31:52.910] muffleCondition <- function (cond, pattern = "^muffle") [15:31:52.910] { [15:31:52.910] inherits <- base::inherits [15:31:52.910] invokeRestart <- base::invokeRestart [15:31:52.910] is.null <- base::is.null [15:31:52.910] muffled <- FALSE [15:31:52.910] if (inherits(cond, "message")) { [15:31:52.910] muffled <- grepl(pattern, "muffleMessage") [15:31:52.910] if (muffled) [15:31:52.910] invokeRestart("muffleMessage") [15:31:52.910] } [15:31:52.910] else if (inherits(cond, "warning")) { [15:31:52.910] muffled <- grepl(pattern, "muffleWarning") [15:31:52.910] if (muffled) [15:31:52.910] invokeRestart("muffleWarning") [15:31:52.910] } [15:31:52.910] else if (inherits(cond, "condition")) { [15:31:52.910] if (!is.null(pattern)) { [15:31:52.910] computeRestarts <- base::computeRestarts [15:31:52.910] grepl <- base::grepl [15:31:52.910] restarts <- computeRestarts(cond) [15:31:52.910] for (restart in restarts) { [15:31:52.910] name <- restart$name [15:31:52.910] if (is.null(name)) [15:31:52.910] next [15:31:52.910] if (!grepl(pattern, name)) [15:31:52.910] next [15:31:52.910] invokeRestart(restart) [15:31:52.910] muffled <- TRUE [15:31:52.910] break [15:31:52.910] } [15:31:52.910] } [15:31:52.910] } [15:31:52.910] invisible(muffled) [15:31:52.910] } [15:31:52.910] muffleCondition(cond, pattern = "^muffle") [15:31:52.910] } [15:31:52.910] } [15:31:52.910] else { [15:31:52.910] if (TRUE) { [15:31:52.910] muffleCondition <- function (cond, pattern = "^muffle") [15:31:52.910] { [15:31:52.910] inherits <- base::inherits [15:31:52.910] invokeRestart <- base::invokeRestart [15:31:52.910] is.null <- base::is.null [15:31:52.910] muffled <- FALSE [15:31:52.910] if (inherits(cond, "message")) { [15:31:52.910] muffled <- grepl(pattern, "muffleMessage") [15:31:52.910] if (muffled) [15:31:52.910] invokeRestart("muffleMessage") [15:31:52.910] } [15:31:52.910] else if (inherits(cond, "warning")) { [15:31:52.910] muffled <- grepl(pattern, "muffleWarning") [15:31:52.910] if (muffled) [15:31:52.910] invokeRestart("muffleWarning") [15:31:52.910] } [15:31:52.910] else if (inherits(cond, "condition")) { [15:31:52.910] if (!is.null(pattern)) { [15:31:52.910] computeRestarts <- base::computeRestarts [15:31:52.910] grepl <- base::grepl [15:31:52.910] restarts <- computeRestarts(cond) [15:31:52.910] for (restart in restarts) { [15:31:52.910] name <- restart$name [15:31:52.910] if (is.null(name)) [15:31:52.910] next [15:31:52.910] if (!grepl(pattern, name)) [15:31:52.910] next [15:31:52.910] invokeRestart(restart) [15:31:52.910] muffled <- TRUE [15:31:52.910] break [15:31:52.910] } [15:31:52.910] } [15:31:52.910] } [15:31:52.910] invisible(muffled) [15:31:52.910] } [15:31:52.910] muffleCondition(cond, pattern = "^muffle") [15:31:52.910] } [15:31:52.910] } [15:31:52.910] } [15:31:52.910] })) [15:31:52.910] }, error = function(ex) { [15:31:52.910] base::structure(base::list(value = NULL, visible = NULL, [15:31:52.910] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:52.910] ...future.rng), started = ...future.startTime, [15:31:52.910] finished = Sys.time(), session_uuid = NA_character_, [15:31:52.910] version = "1.8"), class = "FutureResult") [15:31:52.910] }, finally = { [15:31:52.910] if (!identical(...future.workdir, getwd())) [15:31:52.910] setwd(...future.workdir) [15:31:52.910] { [15:31:52.910] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:52.910] ...future.oldOptions$nwarnings <- NULL [15:31:52.910] } [15:31:52.910] base::options(...future.oldOptions) [15:31:52.910] if (.Platform$OS.type == "windows") { [15:31:52.910] old_names <- names(...future.oldEnvVars) [15:31:52.910] envs <- base::Sys.getenv() [15:31:52.910] names <- names(envs) [15:31:52.910] common <- intersect(names, old_names) [15:31:52.910] added <- setdiff(names, old_names) [15:31:52.910] removed <- setdiff(old_names, names) [15:31:52.910] changed <- common[...future.oldEnvVars[common] != [15:31:52.910] envs[common]] [15:31:52.910] NAMES <- toupper(changed) [15:31:52.910] args <- list() [15:31:52.910] for (kk in seq_along(NAMES)) { [15:31:52.910] name <- changed[[kk]] [15:31:52.910] NAME <- NAMES[[kk]] [15:31:52.910] if (name != NAME && is.element(NAME, old_names)) [15:31:52.910] next [15:31:52.910] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:52.910] } [15:31:52.910] NAMES <- toupper(added) [15:31:52.910] for (kk in seq_along(NAMES)) { [15:31:52.910] name <- added[[kk]] [15:31:52.910] NAME <- NAMES[[kk]] [15:31:52.910] if (name != NAME && is.element(NAME, old_names)) [15:31:52.910] next [15:31:52.910] args[[name]] <- "" [15:31:52.910] } [15:31:52.910] NAMES <- toupper(removed) [15:31:52.910] for (kk in seq_along(NAMES)) { [15:31:52.910] name <- removed[[kk]] [15:31:52.910] NAME <- NAMES[[kk]] [15:31:52.910] if (name != NAME && is.element(NAME, old_names)) [15:31:52.910] next [15:31:52.910] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:52.910] } [15:31:52.910] if (length(args) > 0) [15:31:52.910] base::do.call(base::Sys.setenv, args = args) [15:31:52.910] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:52.910] } [15:31:52.910] else { [15:31:52.910] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:52.910] } [15:31:52.910] { [15:31:52.910] if (base::length(...future.futureOptionsAdded) > [15:31:52.910] 0L) { [15:31:52.910] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:52.910] base::names(opts) <- ...future.futureOptionsAdded [15:31:52.910] base::options(opts) [15:31:52.910] } [15:31:52.910] { [15:31:52.910] { [15:31:52.910] NULL [15:31:52.910] RNGkind("Mersenne-Twister") [15:31:52.910] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:52.910] inherits = FALSE) [15:31:52.910] } [15:31:52.910] options(future.plan = NULL) [15:31:52.910] if (is.na(NA_character_)) [15:31:52.910] Sys.unsetenv("R_FUTURE_PLAN") [15:31:52.910] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:52.910] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:52.910] .init = FALSE) [15:31:52.910] } [15:31:52.910] } [15:31:52.910] } [15:31:52.910] }) [15:31:52.910] if (TRUE) { [15:31:52.910] base::sink(type = "output", split = FALSE) [15:31:52.910] if (TRUE) { [15:31:52.910] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:52.910] } [15:31:52.910] else { [15:31:52.910] ...future.result["stdout"] <- base::list(NULL) [15:31:52.910] } [15:31:52.910] base::close(...future.stdout) [15:31:52.910] ...future.stdout <- NULL [15:31:52.910] } [15:31:52.910] ...future.result$conditions <- ...future.conditions [15:31:52.910] ...future.result$finished <- base::Sys.time() [15:31:52.910] ...future.result [15:31:52.910] } [15:31:52.917] assign_globals() ... [15:31:52.917] List of 5 [15:31:52.917] $ ...future.FUN :function (x, ...) [15:31:52.917] $ future.call.arguments : list() [15:31:52.917] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.917] $ ...future.elements_ii :List of 2 [15:31:52.917] ..$ a:Classes 'listenv', 'environment' [15:31:52.917] ..$ b:Classes 'listenv', 'environment' [15:31:52.917] $ ...future.seeds_ii : NULL [15:31:52.917] $ ...future.globals.maxSize: NULL [15:31:52.917] - attr(*, "where")=List of 5 [15:31:52.917] ..$ ...future.FUN : [15:31:52.917] ..$ future.call.arguments : [15:31:52.917] ..$ ...future.elements_ii : [15:31:52.917] ..$ ...future.seeds_ii : [15:31:52.917] ..$ ...future.globals.maxSize: [15:31:52.917] - attr(*, "resolved")= logi FALSE [15:31:52.917] - attr(*, "total_size")= num 4968 [15:31:52.917] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.917] - attr(*, "already-done")= logi TRUE [15:31:52.927] - copied '...future.FUN' to environment [15:31:52.928] - copied 'future.call.arguments' to environment [15:31:52.928] - copied '...future.elements_ii' to environment [15:31:52.928] - copied '...future.seeds_ii' to environment [15:31:52.929] - copied '...future.globals.maxSize' to environment [15:31:52.929] assign_globals() ... done [15:31:52.930] plan(): Setting new future strategy stack: [15:31:52.930] List of future strategies: [15:31:52.930] 1. sequential: [15:31:52.930] - args: function (..., envir = parent.frame(), workers = "") [15:31:52.930] - tweaked: FALSE [15:31:52.930] - call: NULL [15:31:52.931] plan(): nbrOfWorkers() = 1 [15:31:52.933] plan(): Setting new future strategy stack: [15:31:52.934] List of future strategies: [15:31:52.934] 1. sequential: [15:31:52.934] - args: function (..., envir = parent.frame(), workers = "") [15:31:52.934] - tweaked: FALSE [15:31:52.934] - call: plan(strategy) [15:31:52.935] plan(): nbrOfWorkers() = 1 [15:31:52.935] SequentialFuture started (and completed) [15:31:52.935] - Launch lazy future ... done [15:31:52.936] run() for 'SequentialFuture' ... done [15:31:52.936] Created future: [15:31:52.936] SequentialFuture: [15:31:52.936] Label: 'future_lapply-1' [15:31:52.936] Expression: [15:31:52.936] { [15:31:52.936] do.call(function(...) { [15:31:52.936] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.936] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:52.936] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.936] on.exit(options(oopts), add = TRUE) [15:31:52.936] } [15:31:52.936] { [15:31:52.936] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:52.936] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.936] ...future.FUN(...future.X_jj, ...) [15:31:52.936] }) [15:31:52.936] } [15:31:52.936] }, args = future.call.arguments) [15:31:52.936] } [15:31:52.936] Lazy evaluation: FALSE [15:31:52.936] Asynchronous evaluation: FALSE [15:31:52.936] Local evaluation: TRUE [15:31:52.936] Environment: R_GlobalEnv [15:31:52.936] Capture standard output: TRUE [15:31:52.936] Capture condition classes: 'condition' (excluding 'nothing') [15:31:52.936] Globals: 5 objects totaling 17.90 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 13.05 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:52.936] Packages: 1 packages ('listenv') [15:31:52.936] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:52.936] Resolved: TRUE [15:31:52.936] Value: 800 bytes of class 'list' [15:31:52.936] Early signaling: FALSE [15:31:52.936] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:52.936] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:52.939] Chunk #1 of 1 ... DONE [15:31:52.939] Launching 1 futures (chunks) ... DONE [15:31:52.940] Resolving 1 futures (chunks) ... [15:31:52.940] resolve() on list ... [15:31:52.940] recursive: 0 [15:31:52.940] length: 1 [15:31:52.941] [15:31:52.941] resolved() for 'SequentialFuture' ... [15:31:52.941] - state: 'finished' [15:31:52.942] - run: TRUE [15:31:52.942] - result: 'FutureResult' [15:31:52.942] resolved() for 'SequentialFuture' ... done [15:31:52.943] Future #1 [15:31:52.943] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:52.943] - nx: 1 [15:31:52.943] - relay: TRUE [15:31:52.943] - stdout: TRUE [15:31:52.943] - signal: TRUE [15:31:52.944] - resignal: FALSE [15:31:52.944] - force: TRUE [15:31:52.944] - relayed: [n=1] FALSE [15:31:52.944] - queued futures: [n=1] FALSE [15:31:52.945] - until=1 [15:31:52.945] - relaying element #1 [15:31:52.945] - relayed: [n=1] TRUE [15:31:52.946] - queued futures: [n=1] TRUE [15:31:52.946] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:52.946] length: 0 (resolved future 1) [15:31:52.947] Relaying remaining futures [15:31:52.947] signalConditionsASAP(NULL, pos=0) ... [15:31:52.947] - nx: 1 [15:31:52.947] - relay: TRUE [15:31:52.948] - stdout: TRUE [15:31:52.948] - signal: TRUE [15:31:52.948] - resignal: FALSE [15:31:52.948] - force: TRUE [15:31:52.949] - relayed: [n=1] TRUE [15:31:52.949] - queued futures: [n=1] TRUE - flush all [15:31:52.949] - relayed: [n=1] TRUE [15:31:52.950] - queued futures: [n=1] TRUE [15:31:52.950] signalConditionsASAP(NULL, pos=0) ... done [15:31:52.950] resolve() on list ... DONE [15:31:52.951] - Number of value chunks collected: 1 [15:31:52.951] Resolving 1 futures (chunks) ... DONE [15:31:52.951] Reducing values from 1 chunks ... [15:31:52.952] - Number of values collected after concatenation: 2 [15:31:52.952] - Number of values expected: 2 [15:31:52.952] Reducing values from 1 chunks ... DONE [15:31:52.953] 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, ...) ... [15:31:52.956] future_lapply() ... [15:31:52.957] Number of chunks: 1 [15:31:52.957] Index remapping (attribute 'ordering'): [n = 4] 4, 1, 3, 2 [15:31:52.957] getGlobalsAndPackagesXApply() ... [15:31:52.957] - future.globals: TRUE [15:31:52.958] getGlobalsAndPackages() ... [15:31:52.958] Searching for globals... [15:31:52.960] - globals found: [2] 'FUN', '.Internal' [15:31:52.960] Searching for globals ... DONE [15:31:52.961] Resolving globals: FALSE [15:31:52.961] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:52.962] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:52.962] - globals: [1] 'FUN' [15:31:52.962] [15:31:52.963] getGlobalsAndPackages() ... DONE [15:31:52.963] - globals found/used: [n=1] 'FUN' [15:31:52.963] - needed namespaces: [n=0] [15:31:52.963] Finding globals ... DONE [15:31:52.963] - use_args: TRUE [15:31:52.963] - Getting '...' globals ... [15:31:52.964] resolve() on list ... [15:31:52.964] recursive: 0 [15:31:52.964] length: 1 [15:31:52.965] elements: '...' [15:31:52.965] length: 0 (resolved future 1) [15:31:52.965] resolve() on list ... DONE [15:31:52.965] - '...' content: [n=1] 'length' [15:31:52.965] List of 1 [15:31:52.965] $ ...:List of 1 [15:31:52.965] ..$ length: int 2 [15:31:52.965] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.965] - attr(*, "where")=List of 1 [15:31:52.965] ..$ ...: [15:31:52.965] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.965] - attr(*, "resolved")= logi TRUE [15:31:52.965] - attr(*, "total_size")= num NA [15:31:52.971] - Getting '...' globals ... DONE [15:31:52.971] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:52.971] List of 2 [15:31:52.971] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:52.971] $ ... :List of 1 [15:31:52.971] ..$ length: int 2 [15:31:52.971] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:52.971] - attr(*, "where")=List of 2 [15:31:52.971] ..$ ...future.FUN: [15:31:52.971] ..$ ... : [15:31:52.971] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:52.971] - attr(*, "resolved")= logi FALSE [15:31:52.971] - attr(*, "total_size")= num 2240 [15:31:52.978] Packages to be attached in all futures: [n=0] [15:31:52.978] getGlobalsAndPackagesXApply() ... DONE [15:31:52.979] Number of futures (= number of chunks): 1 [15:31:52.979] Launching 1 futures (chunks) ... [15:31:52.979] Chunk #1 of 1 ... [15:31:52.980] - Finding globals in 'X' for chunk #1 ... [15:31:52.980] getGlobalsAndPackages() ... [15:31:52.980] Searching for globals... [15:31:52.981] [15:31:52.981] Searching for globals ... DONE [15:31:52.981] - globals: [0] [15:31:52.982] getGlobalsAndPackages() ... DONE [15:31:52.982] + additional globals found: [n=0] [15:31:52.982] + additional namespaces needed: [n=0] [15:31:52.983] - Finding globals in 'X' for chunk #1 ... DONE [15:31:52.983] - seeds: [15:31:52.983] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.984] getGlobalsAndPackages() ... [15:31:52.984] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.984] Resolving globals: FALSE [15:31:52.984] Tweak future expression to call with '...' arguments ... [15:31:52.985] { [15:31:52.985] do.call(function(...) { [15:31:52.985] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.985] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:52.985] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.985] on.exit(options(oopts), add = TRUE) [15:31:52.985] } [15:31:52.985] { [15:31:52.985] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:52.985] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.985] ...future.FUN(...future.X_jj, ...) [15:31:52.985] }) [15:31:52.985] } [15:31:52.985] }, args = future.call.arguments) [15:31:52.985] } [15:31:52.986] Tweak future expression to call with '...' arguments ... DONE [15:31:52.986] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:52.987] [15:31:52.987] getGlobalsAndPackages() ... DONE [15:31:52.988] run() for 'Future' ... [15:31:52.988] - state: 'created' [15:31:52.988] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:52.989] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:52.989] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:52.990] - Field: 'label' [15:31:52.990] - Field: 'local' [15:31:52.990] - Field: 'owner' [15:31:52.991] - Field: 'envir' [15:31:52.991] - Field: 'packages' [15:31:52.991] - Field: 'gc' [15:31:52.992] - Field: 'conditions' [15:31:52.992] - Field: 'expr' [15:31:52.992] - Field: 'uuid' [15:31:52.993] - Field: 'seed' [15:31:52.993] - Field: 'version' [15:31:52.993] - Field: 'result' [15:31:52.994] - Field: 'asynchronous' [15:31:52.994] - Field: 'calls' [15:31:52.994] - Field: 'globals' [15:31:52.995] - Field: 'stdout' [15:31:52.995] - Field: 'earlySignal' [15:31:52.995] - Field: 'lazy' [15:31:52.995] - Field: 'state' [15:31:52.996] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:52.996] - Launch lazy future ... [15:31:52.997] Packages needed by the future expression (n = 0): [15:31:52.997] Packages needed by future strategies (n = 0): [15:31:52.998] { [15:31:52.998] { [15:31:52.998] { [15:31:52.998] ...future.startTime <- base::Sys.time() [15:31:52.998] { [15:31:52.998] { [15:31:52.998] { [15:31:52.998] base::local({ [15:31:52.998] has_future <- base::requireNamespace("future", [15:31:52.998] quietly = TRUE) [15:31:52.998] if (has_future) { [15:31:52.998] ns <- base::getNamespace("future") [15:31:52.998] version <- ns[[".package"]][["version"]] [15:31:52.998] if (is.null(version)) [15:31:52.998] version <- utils::packageVersion("future") [15:31:52.998] } [15:31:52.998] else { [15:31:52.998] version <- NULL [15:31:52.998] } [15:31:52.998] if (!has_future || version < "1.8.0") { [15:31:52.998] info <- base::c(r_version = base::gsub("R version ", [15:31:52.998] "", base::R.version$version.string), [15:31:52.998] platform = base::sprintf("%s (%s-bit)", [15:31:52.998] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:52.998] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:52.998] "release", "version")], collapse = " "), [15:31:52.998] hostname = base::Sys.info()[["nodename"]]) [15:31:52.998] info <- base::sprintf("%s: %s", base::names(info), [15:31:52.998] info) [15:31:52.998] info <- base::paste(info, collapse = "; ") [15:31:52.998] if (!has_future) { [15:31:52.998] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:52.998] info) [15:31:52.998] } [15:31:52.998] else { [15:31:52.998] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:52.998] info, version) [15:31:52.998] } [15:31:52.998] base::stop(msg) [15:31:52.998] } [15:31:52.998] }) [15:31:52.998] } [15:31:52.998] ...future.strategy.old <- future::plan("list") [15:31:52.998] options(future.plan = NULL) [15:31:52.998] Sys.unsetenv("R_FUTURE_PLAN") [15:31:52.998] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:52.998] } [15:31:52.998] ...future.workdir <- getwd() [15:31:52.998] } [15:31:52.998] ...future.oldOptions <- base::as.list(base::.Options) [15:31:52.998] ...future.oldEnvVars <- base::Sys.getenv() [15:31:52.998] } [15:31:52.998] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:52.998] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:52.998] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:52.998] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:52.998] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:52.998] future.stdout.windows.reencode = NULL, width = 80L) [15:31:52.998] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:52.998] base::names(...future.oldOptions)) [15:31:52.998] } [15:31:52.998] if (FALSE) { [15:31:52.998] } [15:31:52.998] else { [15:31:52.998] if (TRUE) { [15:31:52.998] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:52.998] open = "w") [15:31:52.998] } [15:31:52.998] else { [15:31:52.998] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:52.998] windows = "NUL", "/dev/null"), open = "w") [15:31:52.998] } [15:31:52.998] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:52.998] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:52.998] base::sink(type = "output", split = FALSE) [15:31:52.998] base::close(...future.stdout) [15:31:52.998] }, add = TRUE) [15:31:52.998] } [15:31:52.998] ...future.frame <- base::sys.nframe() [15:31:52.998] ...future.conditions <- base::list() [15:31:52.998] ...future.rng <- base::globalenv()$.Random.seed [15:31:52.998] if (FALSE) { [15:31:52.998] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:52.998] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:52.998] } [15:31:52.998] ...future.result <- base::tryCatch({ [15:31:52.998] base::withCallingHandlers({ [15:31:52.998] ...future.value <- base::withVisible(base::local({ [15:31:52.998] do.call(function(...) { [15:31:52.998] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:52.998] if (!identical(...future.globals.maxSize.org, [15:31:52.998] ...future.globals.maxSize)) { [15:31:52.998] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:52.998] on.exit(options(oopts), add = TRUE) [15:31:52.998] } [15:31:52.998] { [15:31:52.998] lapply(seq_along(...future.elements_ii), [15:31:52.998] FUN = function(jj) { [15:31:52.998] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:52.998] ...future.FUN(...future.X_jj, ...) [15:31:52.998] }) [15:31:52.998] } [15:31:52.998] }, args = future.call.arguments) [15:31:52.998] })) [15:31:52.998] future::FutureResult(value = ...future.value$value, [15:31:52.998] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:52.998] ...future.rng), globalenv = if (FALSE) [15:31:52.998] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:52.998] ...future.globalenv.names)) [15:31:52.998] else NULL, started = ...future.startTime, version = "1.8") [15:31:52.998] }, condition = base::local({ [15:31:52.998] c <- base::c [15:31:52.998] inherits <- base::inherits [15:31:52.998] invokeRestart <- base::invokeRestart [15:31:52.998] length <- base::length [15:31:52.998] list <- base::list [15:31:52.998] seq.int <- base::seq.int [15:31:52.998] signalCondition <- base::signalCondition [15:31:52.998] sys.calls <- base::sys.calls [15:31:52.998] `[[` <- base::`[[` [15:31:52.998] `+` <- base::`+` [15:31:52.998] `<<-` <- base::`<<-` [15:31:52.998] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:52.998] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:52.998] 3L)] [15:31:52.998] } [15:31:52.998] function(cond) { [15:31:52.998] is_error <- inherits(cond, "error") [15:31:52.998] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:52.998] NULL) [15:31:52.998] if (is_error) { [15:31:52.998] sessionInformation <- function() { [15:31:52.998] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:52.998] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:52.998] search = base::search(), system = base::Sys.info()) [15:31:52.998] } [15:31:52.998] ...future.conditions[[length(...future.conditions) + [15:31:52.998] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:52.998] cond$call), session = sessionInformation(), [15:31:52.998] timestamp = base::Sys.time(), signaled = 0L) [15:31:52.998] signalCondition(cond) [15:31:52.998] } [15:31:52.998] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:52.998] "immediateCondition"))) { [15:31:52.998] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:52.998] ...future.conditions[[length(...future.conditions) + [15:31:52.998] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:52.998] if (TRUE && !signal) { [15:31:52.998] muffleCondition <- function (cond, pattern = "^muffle") [15:31:52.998] { [15:31:52.998] inherits <- base::inherits [15:31:52.998] invokeRestart <- base::invokeRestart [15:31:52.998] is.null <- base::is.null [15:31:52.998] muffled <- FALSE [15:31:52.998] if (inherits(cond, "message")) { [15:31:52.998] muffled <- grepl(pattern, "muffleMessage") [15:31:52.998] if (muffled) [15:31:52.998] invokeRestart("muffleMessage") [15:31:52.998] } [15:31:52.998] else if (inherits(cond, "warning")) { [15:31:52.998] muffled <- grepl(pattern, "muffleWarning") [15:31:52.998] if (muffled) [15:31:52.998] invokeRestart("muffleWarning") [15:31:52.998] } [15:31:52.998] else if (inherits(cond, "condition")) { [15:31:52.998] if (!is.null(pattern)) { [15:31:52.998] computeRestarts <- base::computeRestarts [15:31:52.998] grepl <- base::grepl [15:31:52.998] restarts <- computeRestarts(cond) [15:31:52.998] for (restart in restarts) { [15:31:52.998] name <- restart$name [15:31:52.998] if (is.null(name)) [15:31:52.998] next [15:31:52.998] if (!grepl(pattern, name)) [15:31:52.998] next [15:31:52.998] invokeRestart(restart) [15:31:52.998] muffled <- TRUE [15:31:52.998] break [15:31:52.998] } [15:31:52.998] } [15:31:52.998] } [15:31:52.998] invisible(muffled) [15:31:52.998] } [15:31:52.998] muffleCondition(cond, pattern = "^muffle") [15:31:52.998] } [15:31:52.998] } [15:31:52.998] else { [15:31:52.998] if (TRUE) { [15:31:52.998] muffleCondition <- function (cond, pattern = "^muffle") [15:31:52.998] { [15:31:52.998] inherits <- base::inherits [15:31:52.998] invokeRestart <- base::invokeRestart [15:31:52.998] is.null <- base::is.null [15:31:52.998] muffled <- FALSE [15:31:52.998] if (inherits(cond, "message")) { [15:31:52.998] muffled <- grepl(pattern, "muffleMessage") [15:31:52.998] if (muffled) [15:31:52.998] invokeRestart("muffleMessage") [15:31:52.998] } [15:31:52.998] else if (inherits(cond, "warning")) { [15:31:52.998] muffled <- grepl(pattern, "muffleWarning") [15:31:52.998] if (muffled) [15:31:52.998] invokeRestart("muffleWarning") [15:31:52.998] } [15:31:52.998] else if (inherits(cond, "condition")) { [15:31:52.998] if (!is.null(pattern)) { [15:31:52.998] computeRestarts <- base::computeRestarts [15:31:52.998] grepl <- base::grepl [15:31:52.998] restarts <- computeRestarts(cond) [15:31:52.998] for (restart in restarts) { [15:31:52.998] name <- restart$name [15:31:52.998] if (is.null(name)) [15:31:52.998] next [15:31:52.998] if (!grepl(pattern, name)) [15:31:52.998] next [15:31:52.998] invokeRestart(restart) [15:31:52.998] muffled <- TRUE [15:31:52.998] break [15:31:52.998] } [15:31:52.998] } [15:31:52.998] } [15:31:52.998] invisible(muffled) [15:31:52.998] } [15:31:52.998] muffleCondition(cond, pattern = "^muffle") [15:31:52.998] } [15:31:52.998] } [15:31:52.998] } [15:31:52.998] })) [15:31:52.998] }, error = function(ex) { [15:31:52.998] base::structure(base::list(value = NULL, visible = NULL, [15:31:52.998] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:52.998] ...future.rng), started = ...future.startTime, [15:31:52.998] finished = Sys.time(), session_uuid = NA_character_, [15:31:52.998] version = "1.8"), class = "FutureResult") [15:31:52.998] }, finally = { [15:31:52.998] if (!identical(...future.workdir, getwd())) [15:31:52.998] setwd(...future.workdir) [15:31:52.998] { [15:31:52.998] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:52.998] ...future.oldOptions$nwarnings <- NULL [15:31:52.998] } [15:31:52.998] base::options(...future.oldOptions) [15:31:52.998] if (.Platform$OS.type == "windows") { [15:31:52.998] old_names <- names(...future.oldEnvVars) [15:31:52.998] envs <- base::Sys.getenv() [15:31:52.998] names <- names(envs) [15:31:52.998] common <- intersect(names, old_names) [15:31:52.998] added <- setdiff(names, old_names) [15:31:52.998] removed <- setdiff(old_names, names) [15:31:52.998] changed <- common[...future.oldEnvVars[common] != [15:31:52.998] envs[common]] [15:31:52.998] NAMES <- toupper(changed) [15:31:52.998] args <- list() [15:31:52.998] for (kk in seq_along(NAMES)) { [15:31:52.998] name <- changed[[kk]] [15:31:52.998] NAME <- NAMES[[kk]] [15:31:52.998] if (name != NAME && is.element(NAME, old_names)) [15:31:52.998] next [15:31:52.998] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:52.998] } [15:31:52.998] NAMES <- toupper(added) [15:31:52.998] for (kk in seq_along(NAMES)) { [15:31:52.998] name <- added[[kk]] [15:31:52.998] NAME <- NAMES[[kk]] [15:31:52.998] if (name != NAME && is.element(NAME, old_names)) [15:31:52.998] next [15:31:52.998] args[[name]] <- "" [15:31:52.998] } [15:31:52.998] NAMES <- toupper(removed) [15:31:52.998] for (kk in seq_along(NAMES)) { [15:31:52.998] name <- removed[[kk]] [15:31:52.998] NAME <- NAMES[[kk]] [15:31:52.998] if (name != NAME && is.element(NAME, old_names)) [15:31:52.998] next [15:31:52.998] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:52.998] } [15:31:52.998] if (length(args) > 0) [15:31:52.998] base::do.call(base::Sys.setenv, args = args) [15:31:52.998] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:52.998] } [15:31:52.998] else { [15:31:52.998] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:52.998] } [15:31:52.998] { [15:31:52.998] if (base::length(...future.futureOptionsAdded) > [15:31:52.998] 0L) { [15:31:52.998] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:52.998] base::names(opts) <- ...future.futureOptionsAdded [15:31:52.998] base::options(opts) [15:31:52.998] } [15:31:52.998] { [15:31:52.998] { [15:31:52.998] NULL [15:31:52.998] RNGkind("Mersenne-Twister") [15:31:52.998] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:52.998] inherits = FALSE) [15:31:52.998] } [15:31:52.998] options(future.plan = NULL) [15:31:52.998] if (is.na(NA_character_)) [15:31:52.998] Sys.unsetenv("R_FUTURE_PLAN") [15:31:52.998] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:52.998] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:52.998] .init = FALSE) [15:31:52.998] } [15:31:52.998] } [15:31:52.998] } [15:31:52.998] }) [15:31:52.998] if (TRUE) { [15:31:52.998] base::sink(type = "output", split = FALSE) [15:31:52.998] if (TRUE) { [15:31:52.998] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:52.998] } [15:31:52.998] else { [15:31:52.998] ...future.result["stdout"] <- base::list(NULL) [15:31:52.998] } [15:31:52.998] base::close(...future.stdout) [15:31:52.998] ...future.stdout <- NULL [15:31:52.998] } [15:31:52.998] ...future.result$conditions <- ...future.conditions [15:31:52.998] ...future.result$finished <- base::Sys.time() [15:31:52.998] ...future.result [15:31:52.998] } [15:31:53.005] assign_globals() ... [15:31:53.005] List of 5 [15:31:53.005] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:53.005] $ future.call.arguments :List of 1 [15:31:53.005] ..$ length: int 2 [15:31:53.005] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.005] $ ...future.elements_ii :List of 4 [15:31:53.005] ..$ c: chr "list" [15:31:53.005] ..$ a: chr "integer" [15:31:53.005] ..$ c: chr "character" [15:31:53.005] ..$ b: chr "numeric" [15:31:53.005] $ ...future.seeds_ii : NULL [15:31:53.005] $ ...future.globals.maxSize: NULL [15:31:53.005] - attr(*, "where")=List of 5 [15:31:53.005] ..$ ...future.FUN : [15:31:53.005] ..$ future.call.arguments : [15:31:53.005] ..$ ...future.elements_ii : [15:31:53.005] ..$ ...future.seeds_ii : [15:31:53.005] ..$ ...future.globals.maxSize: [15:31:53.005] - attr(*, "resolved")= logi FALSE [15:31:53.005] - attr(*, "total_size")= num 2240 [15:31:53.005] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.005] - attr(*, "already-done")= logi TRUE [15:31:53.017] - copied '...future.FUN' to environment [15:31:53.018] - copied 'future.call.arguments' to environment [15:31:53.018] - copied '...future.elements_ii' to environment [15:31:53.018] - copied '...future.seeds_ii' to environment [15:31:53.019] - copied '...future.globals.maxSize' to environment [15:31:53.019] assign_globals() ... done [15:31:53.020] plan(): Setting new future strategy stack: [15:31:53.020] List of future strategies: [15:31:53.020] 1. sequential: [15:31:53.020] - args: function (..., envir = parent.frame(), workers = "") [15:31:53.020] - tweaked: FALSE [15:31:53.020] - call: NULL [15:31:53.021] plan(): nbrOfWorkers() = 1 [15:31:53.023] plan(): Setting new future strategy stack: [15:31:53.023] List of future strategies: [15:31:53.023] 1. sequential: [15:31:53.023] - args: function (..., envir = parent.frame(), workers = "") [15:31:53.023] - tweaked: FALSE [15:31:53.023] - call: plan(strategy) [15:31:53.024] plan(): nbrOfWorkers() = 1 [15:31:53.025] SequentialFuture started (and completed) [15:31:53.025] - Launch lazy future ... done [15:31:53.026] run() for 'SequentialFuture' ... done [15:31:53.026] Created future: [15:31:53.026] SequentialFuture: [15:31:53.026] Label: 'future_lapply-1' [15:31:53.026] Expression: [15:31:53.026] { [15:31:53.026] do.call(function(...) { [15:31:53.026] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.026] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:53.026] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.026] on.exit(options(oopts), add = TRUE) [15:31:53.026] } [15:31:53.026] { [15:31:53.026] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:53.026] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.026] ...future.FUN(...future.X_jj, ...) [15:31:53.026] }) [15:31:53.026] } [15:31:53.026] }, args = future.call.arguments) [15:31:53.026] } [15:31:53.026] Lazy evaluation: FALSE [15:31:53.026] Asynchronous evaluation: FALSE [15:31:53.026] Local evaluation: TRUE [15:31:53.026] Environment: R_GlobalEnv [15:31:53.026] Capture standard output: TRUE [15:31:53.026] Capture condition classes: 'condition' (excluding 'nothing') [15:31:53.026] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:53.026] Packages: [15:31:53.026] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:53.026] Resolved: TRUE [15:31:53.026] Value: 240 bytes of class 'list' [15:31:53.026] Early signaling: FALSE [15:31:53.026] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:53.026] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:53.029] Chunk #1 of 1 ... DONE [15:31:53.029] Launching 1 futures (chunks) ... DONE [15:31:53.029] Resolving 1 futures (chunks) ... [15:31:53.030] resolve() on list ... [15:31:53.030] recursive: 0 [15:31:53.030] length: 1 [15:31:53.030] [15:31:53.031] resolved() for 'SequentialFuture' ... [15:31:53.031] - state: 'finished' [15:31:53.031] - run: TRUE [15:31:53.032] - result: 'FutureResult' [15:31:53.032] resolved() for 'SequentialFuture' ... done [15:31:53.032] Future #1 [15:31:53.033] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:53.033] - nx: 1 [15:31:53.033] - relay: TRUE [15:31:53.034] - stdout: TRUE [15:31:53.034] - signal: TRUE [15:31:53.034] - resignal: FALSE [15:31:53.034] - force: TRUE [15:31:53.035] - relayed: [n=1] FALSE [15:31:53.035] - queued futures: [n=1] FALSE [15:31:53.035] - until=1 [15:31:53.035] - relaying element #1 [15:31:53.036] - relayed: [n=1] TRUE [15:31:53.036] - queued futures: [n=1] TRUE [15:31:53.037] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:53.037] length: 0 (resolved future 1) [15:31:53.037] Relaying remaining futures [15:31:53.037] signalConditionsASAP(NULL, pos=0) ... [15:31:53.038] - nx: 1 [15:31:53.038] - relay: TRUE [15:31:53.038] - stdout: TRUE [15:31:53.038] - signal: TRUE [15:31:53.039] - resignal: FALSE [15:31:53.039] - force: TRUE [15:31:53.039] - relayed: [n=1] TRUE [15:31:53.040] - queued futures: [n=1] TRUE - flush all [15:31:53.040] - relayed: [n=1] TRUE [15:31:53.040] - queued futures: [n=1] TRUE [15:31:53.041] signalConditionsASAP(NULL, pos=0) ... done [15:31:53.041] resolve() on list ... DONE [15:31:53.041] - Number of value chunks collected: 1 [15:31:53.041] Resolving 1 futures (chunks) ... DONE [15:31:53.042] Reducing values from 1 chunks ... [15:31:53.042] - Number of values collected after concatenation: 4 [15:31:53.042] - Number of values expected: 4 [15:31:53.043] Reverse index remapping (attribute 'ordering'): [n = 4] 2, 4, 3, 1 [15:31:53.043] Reducing values from 1 chunks ... DONE [15:31:53.043] 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 [15:31:53.048] future_lapply() ... [15:31:53.049] Number of chunks: 1 [15:31:53.050] Index remapping (attribute 'ordering'): [n = 4] 2, 4, 3, 1 [15:31:53.050] getGlobalsAndPackagesXApply() ... [15:31:53.050] - future.globals: TRUE [15:31:53.050] getGlobalsAndPackages() ... [15:31:53.051] Searching for globals... [15:31:53.053] - globals found: [2] 'FUN', '.Internal' [15:31:53.053] Searching for globals ... DONE [15:31:53.054] Resolving globals: FALSE [15:31:53.055] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:53.055] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:53.056] - globals: [1] 'FUN' [15:31:53.056] [15:31:53.056] getGlobalsAndPackages() ... DONE [15:31:53.057] - globals found/used: [n=1] 'FUN' [15:31:53.057] - needed namespaces: [n=0] [15:31:53.057] Finding globals ... DONE [15:31:53.057] - use_args: TRUE [15:31:53.058] - Getting '...' globals ... [15:31:53.058] resolve() on list ... [15:31:53.059] recursive: 0 [15:31:53.059] length: 1 [15:31:53.059] elements: '...' [15:31:53.060] length: 0 (resolved future 1) [15:31:53.060] resolve() on list ... DONE [15:31:53.060] - '...' content: [n=1] 'length' [15:31:53.060] List of 1 [15:31:53.060] $ ...:List of 1 [15:31:53.060] ..$ length: int 2 [15:31:53.060] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.060] - attr(*, "where")=List of 1 [15:31:53.060] ..$ ...: [15:31:53.060] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.060] - attr(*, "resolved")= logi TRUE [15:31:53.060] - attr(*, "total_size")= num NA [15:31:53.067] - Getting '...' globals ... DONE [15:31:53.067] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:53.072] List of 2 [15:31:53.072] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:53.072] $ ... :List of 1 [15:31:53.072] ..$ length: int 2 [15:31:53.072] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.072] - attr(*, "where")=List of 2 [15:31:53.072] ..$ ...future.FUN: [15:31:53.072] ..$ ... : [15:31:53.072] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.072] - attr(*, "resolved")= logi FALSE [15:31:53.072] - attr(*, "total_size")= num 2240 [15:31:53.078] Packages to be attached in all futures: [n=0] [15:31:53.079] getGlobalsAndPackagesXApply() ... DONE [15:31:53.079] Number of futures (= number of chunks): 1 [15:31:53.080] Launching 1 futures (chunks) ... [15:31:53.080] Chunk #1 of 1 ... [15:31:53.080] - Finding globals in 'X' for chunk #1 ... [15:31:53.081] getGlobalsAndPackages() ... [15:31:53.081] Searching for globals... [15:31:53.082] [15:31:53.082] Searching for globals ... DONE [15:31:53.082] - globals: [0] [15:31:53.082] getGlobalsAndPackages() ... DONE [15:31:53.083] + additional globals found: [n=0] [15:31:53.083] + additional namespaces needed: [n=0] [15:31:53.083] - Finding globals in 'X' for chunk #1 ... DONE [15:31:53.084] - seeds: [15:31:53.084] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.084] getGlobalsAndPackages() ... [15:31:53.084] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.085] Resolving globals: FALSE [15:31:53.085] Tweak future expression to call with '...' arguments ... [15:31:53.085] { [15:31:53.085] do.call(function(...) { [15:31:53.085] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.085] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:53.085] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.085] on.exit(options(oopts), add = TRUE) [15:31:53.085] } [15:31:53.085] { [15:31:53.085] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:53.085] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.085] ...future.FUN(...future.X_jj, ...) [15:31:53.085] }) [15:31:53.085] } [15:31:53.085] }, args = future.call.arguments) [15:31:53.085] } [15:31:53.086] Tweak future expression to call with '...' arguments ... DONE [15:31:53.086] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.086] [15:31:53.087] getGlobalsAndPackages() ... DONE [15:31:53.087] run() for 'Future' ... [15:31:53.087] - state: 'created' [15:31:53.087] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:53.088] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:53.088] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:53.088] - Field: 'label' [15:31:53.088] - Field: 'local' [15:31:53.089] - Field: 'owner' [15:31:53.089] - Field: 'envir' [15:31:53.089] - Field: 'packages' [15:31:53.089] - Field: 'gc' [15:31:53.089] - Field: 'conditions' [15:31:53.090] - Field: 'expr' [15:31:53.090] - Field: 'uuid' [15:31:53.090] - Field: 'seed' [15:31:53.090] - Field: 'version' [15:31:53.090] - Field: 'result' [15:31:53.091] - Field: 'asynchronous' [15:31:53.091] - Field: 'calls' [15:31:53.091] - Field: 'globals' [15:31:53.091] - Field: 'stdout' [15:31:53.092] - Field: 'earlySignal' [15:31:53.092] - Field: 'lazy' [15:31:53.092] - Field: 'state' [15:31:53.092] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:53.093] - Launch lazy future ... [15:31:53.093] Packages needed by the future expression (n = 0): [15:31:53.093] Packages needed by future strategies (n = 0): [15:31:53.094] { [15:31:53.094] { [15:31:53.094] { [15:31:53.094] ...future.startTime <- base::Sys.time() [15:31:53.094] { [15:31:53.094] { [15:31:53.094] { [15:31:53.094] base::local({ [15:31:53.094] has_future <- base::requireNamespace("future", [15:31:53.094] quietly = TRUE) [15:31:53.094] if (has_future) { [15:31:53.094] ns <- base::getNamespace("future") [15:31:53.094] version <- ns[[".package"]][["version"]] [15:31:53.094] if (is.null(version)) [15:31:53.094] version <- utils::packageVersion("future") [15:31:53.094] } [15:31:53.094] else { [15:31:53.094] version <- NULL [15:31:53.094] } [15:31:53.094] if (!has_future || version < "1.8.0") { [15:31:53.094] info <- base::c(r_version = base::gsub("R version ", [15:31:53.094] "", base::R.version$version.string), [15:31:53.094] platform = base::sprintf("%s (%s-bit)", [15:31:53.094] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:53.094] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:53.094] "release", "version")], collapse = " "), [15:31:53.094] hostname = base::Sys.info()[["nodename"]]) [15:31:53.094] info <- base::sprintf("%s: %s", base::names(info), [15:31:53.094] info) [15:31:53.094] info <- base::paste(info, collapse = "; ") [15:31:53.094] if (!has_future) { [15:31:53.094] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:53.094] info) [15:31:53.094] } [15:31:53.094] else { [15:31:53.094] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:53.094] info, version) [15:31:53.094] } [15:31:53.094] base::stop(msg) [15:31:53.094] } [15:31:53.094] }) [15:31:53.094] } [15:31:53.094] ...future.strategy.old <- future::plan("list") [15:31:53.094] options(future.plan = NULL) [15:31:53.094] Sys.unsetenv("R_FUTURE_PLAN") [15:31:53.094] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:53.094] } [15:31:53.094] ...future.workdir <- getwd() [15:31:53.094] } [15:31:53.094] ...future.oldOptions <- base::as.list(base::.Options) [15:31:53.094] ...future.oldEnvVars <- base::Sys.getenv() [15:31:53.094] } [15:31:53.094] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:53.094] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:53.094] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:53.094] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:53.094] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:53.094] future.stdout.windows.reencode = NULL, width = 80L) [15:31:53.094] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:53.094] base::names(...future.oldOptions)) [15:31:53.094] } [15:31:53.094] if (FALSE) { [15:31:53.094] } [15:31:53.094] else { [15:31:53.094] if (TRUE) { [15:31:53.094] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:53.094] open = "w") [15:31:53.094] } [15:31:53.094] else { [15:31:53.094] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:53.094] windows = "NUL", "/dev/null"), open = "w") [15:31:53.094] } [15:31:53.094] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:53.094] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:53.094] base::sink(type = "output", split = FALSE) [15:31:53.094] base::close(...future.stdout) [15:31:53.094] }, add = TRUE) [15:31:53.094] } [15:31:53.094] ...future.frame <- base::sys.nframe() [15:31:53.094] ...future.conditions <- base::list() [15:31:53.094] ...future.rng <- base::globalenv()$.Random.seed [15:31:53.094] if (FALSE) { [15:31:53.094] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:53.094] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:53.094] } [15:31:53.094] ...future.result <- base::tryCatch({ [15:31:53.094] base::withCallingHandlers({ [15:31:53.094] ...future.value <- base::withVisible(base::local({ [15:31:53.094] do.call(function(...) { [15:31:53.094] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.094] if (!identical(...future.globals.maxSize.org, [15:31:53.094] ...future.globals.maxSize)) { [15:31:53.094] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.094] on.exit(options(oopts), add = TRUE) [15:31:53.094] } [15:31:53.094] { [15:31:53.094] lapply(seq_along(...future.elements_ii), [15:31:53.094] FUN = function(jj) { [15:31:53.094] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.094] ...future.FUN(...future.X_jj, ...) [15:31:53.094] }) [15:31:53.094] } [15:31:53.094] }, args = future.call.arguments) [15:31:53.094] })) [15:31:53.094] future::FutureResult(value = ...future.value$value, [15:31:53.094] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:53.094] ...future.rng), globalenv = if (FALSE) [15:31:53.094] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:53.094] ...future.globalenv.names)) [15:31:53.094] else NULL, started = ...future.startTime, version = "1.8") [15:31:53.094] }, condition = base::local({ [15:31:53.094] c <- base::c [15:31:53.094] inherits <- base::inherits [15:31:53.094] invokeRestart <- base::invokeRestart [15:31:53.094] length <- base::length [15:31:53.094] list <- base::list [15:31:53.094] seq.int <- base::seq.int [15:31:53.094] signalCondition <- base::signalCondition [15:31:53.094] sys.calls <- base::sys.calls [15:31:53.094] `[[` <- base::`[[` [15:31:53.094] `+` <- base::`+` [15:31:53.094] `<<-` <- base::`<<-` [15:31:53.094] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:53.094] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:53.094] 3L)] [15:31:53.094] } [15:31:53.094] function(cond) { [15:31:53.094] is_error <- inherits(cond, "error") [15:31:53.094] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:53.094] NULL) [15:31:53.094] if (is_error) { [15:31:53.094] sessionInformation <- function() { [15:31:53.094] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:53.094] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:53.094] search = base::search(), system = base::Sys.info()) [15:31:53.094] } [15:31:53.094] ...future.conditions[[length(...future.conditions) + [15:31:53.094] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:53.094] cond$call), session = sessionInformation(), [15:31:53.094] timestamp = base::Sys.time(), signaled = 0L) [15:31:53.094] signalCondition(cond) [15:31:53.094] } [15:31:53.094] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:53.094] "immediateCondition"))) { [15:31:53.094] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:53.094] ...future.conditions[[length(...future.conditions) + [15:31:53.094] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:53.094] if (TRUE && !signal) { [15:31:53.094] muffleCondition <- function (cond, pattern = "^muffle") [15:31:53.094] { [15:31:53.094] inherits <- base::inherits [15:31:53.094] invokeRestart <- base::invokeRestart [15:31:53.094] is.null <- base::is.null [15:31:53.094] muffled <- FALSE [15:31:53.094] if (inherits(cond, "message")) { [15:31:53.094] muffled <- grepl(pattern, "muffleMessage") [15:31:53.094] if (muffled) [15:31:53.094] invokeRestart("muffleMessage") [15:31:53.094] } [15:31:53.094] else if (inherits(cond, "warning")) { [15:31:53.094] muffled <- grepl(pattern, "muffleWarning") [15:31:53.094] if (muffled) [15:31:53.094] invokeRestart("muffleWarning") [15:31:53.094] } [15:31:53.094] else if (inherits(cond, "condition")) { [15:31:53.094] if (!is.null(pattern)) { [15:31:53.094] computeRestarts <- base::computeRestarts [15:31:53.094] grepl <- base::grepl [15:31:53.094] restarts <- computeRestarts(cond) [15:31:53.094] for (restart in restarts) { [15:31:53.094] name <- restart$name [15:31:53.094] if (is.null(name)) [15:31:53.094] next [15:31:53.094] if (!grepl(pattern, name)) [15:31:53.094] next [15:31:53.094] invokeRestart(restart) [15:31:53.094] muffled <- TRUE [15:31:53.094] break [15:31:53.094] } [15:31:53.094] } [15:31:53.094] } [15:31:53.094] invisible(muffled) [15:31:53.094] } [15:31:53.094] muffleCondition(cond, pattern = "^muffle") [15:31:53.094] } [15:31:53.094] } [15:31:53.094] else { [15:31:53.094] if (TRUE) { [15:31:53.094] muffleCondition <- function (cond, pattern = "^muffle") [15:31:53.094] { [15:31:53.094] inherits <- base::inherits [15:31:53.094] invokeRestart <- base::invokeRestart [15:31:53.094] is.null <- base::is.null [15:31:53.094] muffled <- FALSE [15:31:53.094] if (inherits(cond, "message")) { [15:31:53.094] muffled <- grepl(pattern, "muffleMessage") [15:31:53.094] if (muffled) [15:31:53.094] invokeRestart("muffleMessage") [15:31:53.094] } [15:31:53.094] else if (inherits(cond, "warning")) { [15:31:53.094] muffled <- grepl(pattern, "muffleWarning") [15:31:53.094] if (muffled) [15:31:53.094] invokeRestart("muffleWarning") [15:31:53.094] } [15:31:53.094] else if (inherits(cond, "condition")) { [15:31:53.094] if (!is.null(pattern)) { [15:31:53.094] computeRestarts <- base::computeRestarts [15:31:53.094] grepl <- base::grepl [15:31:53.094] restarts <- computeRestarts(cond) [15:31:53.094] for (restart in restarts) { [15:31:53.094] name <- restart$name [15:31:53.094] if (is.null(name)) [15:31:53.094] next [15:31:53.094] if (!grepl(pattern, name)) [15:31:53.094] next [15:31:53.094] invokeRestart(restart) [15:31:53.094] muffled <- TRUE [15:31:53.094] break [15:31:53.094] } [15:31:53.094] } [15:31:53.094] } [15:31:53.094] invisible(muffled) [15:31:53.094] } [15:31:53.094] muffleCondition(cond, pattern = "^muffle") [15:31:53.094] } [15:31:53.094] } [15:31:53.094] } [15:31:53.094] })) [15:31:53.094] }, error = function(ex) { [15:31:53.094] base::structure(base::list(value = NULL, visible = NULL, [15:31:53.094] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:53.094] ...future.rng), started = ...future.startTime, [15:31:53.094] finished = Sys.time(), session_uuid = NA_character_, [15:31:53.094] version = "1.8"), class = "FutureResult") [15:31:53.094] }, finally = { [15:31:53.094] if (!identical(...future.workdir, getwd())) [15:31:53.094] setwd(...future.workdir) [15:31:53.094] { [15:31:53.094] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:53.094] ...future.oldOptions$nwarnings <- NULL [15:31:53.094] } [15:31:53.094] base::options(...future.oldOptions) [15:31:53.094] if (.Platform$OS.type == "windows") { [15:31:53.094] old_names <- names(...future.oldEnvVars) [15:31:53.094] envs <- base::Sys.getenv() [15:31:53.094] names <- names(envs) [15:31:53.094] common <- intersect(names, old_names) [15:31:53.094] added <- setdiff(names, old_names) [15:31:53.094] removed <- setdiff(old_names, names) [15:31:53.094] changed <- common[...future.oldEnvVars[common] != [15:31:53.094] envs[common]] [15:31:53.094] NAMES <- toupper(changed) [15:31:53.094] args <- list() [15:31:53.094] for (kk in seq_along(NAMES)) { [15:31:53.094] name <- changed[[kk]] [15:31:53.094] NAME <- NAMES[[kk]] [15:31:53.094] if (name != NAME && is.element(NAME, old_names)) [15:31:53.094] next [15:31:53.094] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:53.094] } [15:31:53.094] NAMES <- toupper(added) [15:31:53.094] for (kk in seq_along(NAMES)) { [15:31:53.094] name <- added[[kk]] [15:31:53.094] NAME <- NAMES[[kk]] [15:31:53.094] if (name != NAME && is.element(NAME, old_names)) [15:31:53.094] next [15:31:53.094] args[[name]] <- "" [15:31:53.094] } [15:31:53.094] NAMES <- toupper(removed) [15:31:53.094] for (kk in seq_along(NAMES)) { [15:31:53.094] name <- removed[[kk]] [15:31:53.094] NAME <- NAMES[[kk]] [15:31:53.094] if (name != NAME && is.element(NAME, old_names)) [15:31:53.094] next [15:31:53.094] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:53.094] } [15:31:53.094] if (length(args) > 0) [15:31:53.094] base::do.call(base::Sys.setenv, args = args) [15:31:53.094] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:53.094] } [15:31:53.094] else { [15:31:53.094] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:53.094] } [15:31:53.094] { [15:31:53.094] if (base::length(...future.futureOptionsAdded) > [15:31:53.094] 0L) { [15:31:53.094] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:53.094] base::names(opts) <- ...future.futureOptionsAdded [15:31:53.094] base::options(opts) [15:31:53.094] } [15:31:53.094] { [15:31:53.094] { [15:31:53.094] NULL [15:31:53.094] RNGkind("Mersenne-Twister") [15:31:53.094] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:53.094] inherits = FALSE) [15:31:53.094] } [15:31:53.094] options(future.plan = NULL) [15:31:53.094] if (is.na(NA_character_)) [15:31:53.094] Sys.unsetenv("R_FUTURE_PLAN") [15:31:53.094] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:53.094] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:53.094] .init = FALSE) [15:31:53.094] } [15:31:53.094] } [15:31:53.094] } [15:31:53.094] }) [15:31:53.094] if (TRUE) { [15:31:53.094] base::sink(type = "output", split = FALSE) [15:31:53.094] if (TRUE) { [15:31:53.094] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:53.094] } [15:31:53.094] else { [15:31:53.094] ...future.result["stdout"] <- base::list(NULL) [15:31:53.094] } [15:31:53.094] base::close(...future.stdout) [15:31:53.094] ...future.stdout <- NULL [15:31:53.094] } [15:31:53.094] ...future.result$conditions <- ...future.conditions [15:31:53.094] ...future.result$finished <- base::Sys.time() [15:31:53.094] ...future.result [15:31:53.094] } [15:31:53.101] assign_globals() ... [15:31:53.101] List of 5 [15:31:53.101] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:53.101] $ future.call.arguments :List of 1 [15:31:53.101] ..$ length: int 2 [15:31:53.101] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.101] $ ...future.elements_ii :List of 4 [15:31:53.101] ..$ b: chr "numeric" [15:31:53.101] ..$ c: chr "list" [15:31:53.101] ..$ c: chr "character" [15:31:53.101] ..$ a: chr "integer" [15:31:53.101] $ ...future.seeds_ii : NULL [15:31:53.101] $ ...future.globals.maxSize: NULL [15:31:53.101] - attr(*, "where")=List of 5 [15:31:53.101] ..$ ...future.FUN : [15:31:53.101] ..$ future.call.arguments : [15:31:53.101] ..$ ...future.elements_ii : [15:31:53.101] ..$ ...future.seeds_ii : [15:31:53.101] ..$ ...future.globals.maxSize: [15:31:53.101] - attr(*, "resolved")= logi FALSE [15:31:53.101] - attr(*, "total_size")= num 2240 [15:31:53.101] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.101] - attr(*, "already-done")= logi TRUE [15:31:53.112] - copied '...future.FUN' to environment [15:31:53.113] - copied 'future.call.arguments' to environment [15:31:53.113] - copied '...future.elements_ii' to environment [15:31:53.113] - copied '...future.seeds_ii' to environment [15:31:53.114] - copied '...future.globals.maxSize' to environment [15:31:53.114] assign_globals() ... done [15:31:53.115] plan(): Setting new future strategy stack: [15:31:53.115] List of future strategies: [15:31:53.115] 1. sequential: [15:31:53.115] - args: function (..., envir = parent.frame(), workers = "") [15:31:53.115] - tweaked: FALSE [15:31:53.115] - call: NULL [15:31:53.116] plan(): nbrOfWorkers() = 1 [15:31:53.118] plan(): Setting new future strategy stack: [15:31:53.118] List of future strategies: [15:31:53.118] 1. sequential: [15:31:53.118] - args: function (..., envir = parent.frame(), workers = "") [15:31:53.118] - tweaked: FALSE [15:31:53.118] - call: plan(strategy) [15:31:53.119] plan(): nbrOfWorkers() = 1 [15:31:53.119] SequentialFuture started (and completed) [15:31:53.120] - Launch lazy future ... done [15:31:53.120] run() for 'SequentialFuture' ... done [15:31:53.120] Created future: [15:31:53.121] SequentialFuture: [15:31:53.121] Label: 'future_lapply-1' [15:31:53.121] Expression: [15:31:53.121] { [15:31:53.121] do.call(function(...) { [15:31:53.121] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.121] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:53.121] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.121] on.exit(options(oopts), add = TRUE) [15:31:53.121] } [15:31:53.121] { [15:31:53.121] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:53.121] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.121] ...future.FUN(...future.X_jj, ...) [15:31:53.121] }) [15:31:53.121] } [15:31:53.121] }, args = future.call.arguments) [15:31:53.121] } [15:31:53.121] Lazy evaluation: FALSE [15:31:53.121] Asynchronous evaluation: FALSE [15:31:53.121] Local evaluation: TRUE [15:31:53.121] Environment: R_GlobalEnv [15:31:53.121] Capture standard output: TRUE [15:31:53.121] Capture condition classes: 'condition' (excluding 'nothing') [15:31:53.121] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:53.121] Packages: [15:31:53.121] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:53.121] Resolved: TRUE [15:31:53.121] Value: 240 bytes of class 'list' [15:31:53.121] Early signaling: FALSE [15:31:53.121] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:53.121] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:53.122] Chunk #1 of 1 ... DONE [15:31:53.123] Launching 1 futures (chunks) ... DONE [15:31:53.123] Resolving 1 futures (chunks) ... [15:31:53.123] resolve() on list ... [15:31:53.123] recursive: 0 [15:31:53.123] length: 1 [15:31:53.124] [15:31:53.124] resolved() for 'SequentialFuture' ... [15:31:53.124] - state: 'finished' [15:31:53.124] - run: TRUE [15:31:53.125] - result: 'FutureResult' [15:31:53.125] resolved() for 'SequentialFuture' ... done [15:31:53.125] Future #1 [15:31:53.126] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:53.126] - nx: 1 [15:31:53.127] - relay: TRUE [15:31:53.127] - stdout: TRUE [15:31:53.127] - signal: TRUE [15:31:53.127] - resignal: FALSE [15:31:53.127] - force: TRUE [15:31:53.128] - relayed: [n=1] FALSE [15:31:53.128] - queued futures: [n=1] FALSE [15:31:53.128] - until=1 [15:31:53.128] - relaying element #1 [15:31:53.128] - relayed: [n=1] TRUE [15:31:53.129] - queued futures: [n=1] TRUE [15:31:53.129] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:53.129] length: 0 (resolved future 1) [15:31:53.129] Relaying remaining futures [15:31:53.129] signalConditionsASAP(NULL, pos=0) ... [15:31:53.129] - nx: 1 [15:31:53.130] - relay: TRUE [15:31:53.130] - stdout: TRUE [15:31:53.130] - signal: TRUE [15:31:53.130] - resignal: FALSE [15:31:53.130] - force: TRUE [15:31:53.130] - relayed: [n=1] TRUE [15:31:53.131] - queued futures: [n=1] TRUE - flush all [15:31:53.131] - relayed: [n=1] TRUE [15:31:53.131] - queued futures: [n=1] TRUE [15:31:53.131] signalConditionsASAP(NULL, pos=0) ... done [15:31:53.131] resolve() on list ... DONE [15:31:53.132] - Number of value chunks collected: 1 [15:31:53.132] Resolving 1 futures (chunks) ... DONE [15:31:53.132] Reducing values from 1 chunks ... [15:31:53.132] - Number of values collected after concatenation: 4 [15:31:53.132] - Number of values expected: 4 [15:31:53.133] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 1, 3, 2 [15:31:53.133] Reducing values from 1 chunks ... DONE [15:31:53.133] 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, ...) ... [15:31:53.136] future_lapply() ... [15:31:53.137] Number of chunks: 1 [15:31:53.137] Index remapping (attribute 'ordering'): [n = 4] 2, 3, 4, 1 [15:31:53.137] getGlobalsAndPackagesXApply() ... [15:31:53.137] - future.globals: TRUE [15:31:53.138] getGlobalsAndPackages() ... [15:31:53.138] Searching for globals... [15:31:53.139] - globals found: [2] 'FUN', '.Internal' [15:31:53.140] Searching for globals ... DONE [15:31:53.140] Resolving globals: FALSE [15:31:53.140] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:53.141] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:53.141] - globals: [1] 'FUN' [15:31:53.142] [15:31:53.142] getGlobalsAndPackages() ... DONE [15:31:53.142] - globals found/used: [n=1] 'FUN' [15:31:53.143] - needed namespaces: [n=0] [15:31:53.143] Finding globals ... DONE [15:31:53.143] - use_args: TRUE [15:31:53.143] - Getting '...' globals ... [15:31:53.144] resolve() on list ... [15:31:53.144] recursive: 0 [15:31:53.145] length: 1 [15:31:53.145] elements: '...' [15:31:53.145] length: 0 (resolved future 1) [15:31:53.146] resolve() on list ... DONE [15:31:53.146] - '...' content: [n=1] 'length' [15:31:53.146] List of 1 [15:31:53.146] $ ...:List of 1 [15:31:53.146] ..$ length: int 2 [15:31:53.146] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.146] - attr(*, "where")=List of 1 [15:31:53.146] ..$ ...: [15:31:53.146] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.146] - attr(*, "resolved")= logi TRUE [15:31:53.146] - attr(*, "total_size")= num NA [15:31:53.150] - Getting '...' globals ... DONE [15:31:53.150] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:53.151] List of 2 [15:31:53.151] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:53.151] $ ... :List of 1 [15:31:53.151] ..$ length: int 2 [15:31:53.151] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.151] - attr(*, "where")=List of 2 [15:31:53.151] ..$ ...future.FUN: [15:31:53.151] ..$ ... : [15:31:53.151] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.151] - attr(*, "resolved")= logi FALSE [15:31:53.151] - attr(*, "total_size")= num 2240 [15:31:53.155] Packages to be attached in all futures: [n=0] [15:31:53.155] getGlobalsAndPackagesXApply() ... DONE [15:31:53.155] Number of futures (= number of chunks): 1 [15:31:53.155] Launching 1 futures (chunks) ... [15:31:53.156] Chunk #1 of 1 ... [15:31:53.156] - Finding globals in 'X' for chunk #1 ... [15:31:53.156] getGlobalsAndPackages() ... [15:31:53.156] Searching for globals... [15:31:53.156] [15:31:53.157] Searching for globals ... DONE [15:31:53.157] - globals: [0] [15:31:53.157] getGlobalsAndPackages() ... DONE [15:31:53.157] + additional globals found: [n=0] [15:31:53.157] + additional namespaces needed: [n=0] [15:31:53.157] - Finding globals in 'X' for chunk #1 ... DONE [15:31:53.158] - seeds: [15:31:53.158] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.158] getGlobalsAndPackages() ... [15:31:53.158] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.159] Resolving globals: FALSE [15:31:53.159] Tweak future expression to call with '...' arguments ... [15:31:53.159] { [15:31:53.159] do.call(function(...) { [15:31:53.159] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.159] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:53.159] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.159] on.exit(options(oopts), add = TRUE) [15:31:53.159] } [15:31:53.159] { [15:31:53.159] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:53.159] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.159] ...future.FUN(...future.X_jj, ...) [15:31:53.159] }) [15:31:53.159] } [15:31:53.159] }, args = future.call.arguments) [15:31:53.159] } [15:31:53.160] Tweak future expression to call with '...' arguments ... DONE [15:31:53.161] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.161] [15:31:53.161] getGlobalsAndPackages() ... DONE [15:31:53.162] run() for 'Future' ... [15:31:53.162] - state: 'created' [15:31:53.162] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:53.162] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:53.163] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:53.163] - Field: 'label' [15:31:53.163] - Field: 'local' [15:31:53.163] - Field: 'owner' [15:31:53.163] - Field: 'envir' [15:31:53.164] - Field: 'packages' [15:31:53.164] - Field: 'gc' [15:31:53.164] - Field: 'conditions' [15:31:53.164] - Field: 'expr' [15:31:53.164] - Field: 'uuid' [15:31:53.164] - Field: 'seed' [15:31:53.165] - Field: 'version' [15:31:53.165] - Field: 'result' [15:31:53.165] - Field: 'asynchronous' [15:31:53.165] - Field: 'calls' [15:31:53.165] - Field: 'globals' [15:31:53.166] - Field: 'stdout' [15:31:53.166] - Field: 'earlySignal' [15:31:53.166] - Field: 'lazy' [15:31:53.166] - Field: 'state' [15:31:53.166] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:53.166] - Launch lazy future ... [15:31:53.167] Packages needed by the future expression (n = 0): [15:31:53.167] Packages needed by future strategies (n = 0): [15:31:53.168] { [15:31:53.168] { [15:31:53.168] { [15:31:53.168] ...future.startTime <- base::Sys.time() [15:31:53.168] { [15:31:53.168] { [15:31:53.168] { [15:31:53.168] base::local({ [15:31:53.168] has_future <- base::requireNamespace("future", [15:31:53.168] quietly = TRUE) [15:31:53.168] if (has_future) { [15:31:53.168] ns <- base::getNamespace("future") [15:31:53.168] version <- ns[[".package"]][["version"]] [15:31:53.168] if (is.null(version)) [15:31:53.168] version <- utils::packageVersion("future") [15:31:53.168] } [15:31:53.168] else { [15:31:53.168] version <- NULL [15:31:53.168] } [15:31:53.168] if (!has_future || version < "1.8.0") { [15:31:53.168] info <- base::c(r_version = base::gsub("R version ", [15:31:53.168] "", base::R.version$version.string), [15:31:53.168] platform = base::sprintf("%s (%s-bit)", [15:31:53.168] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:53.168] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:53.168] "release", "version")], collapse = " "), [15:31:53.168] hostname = base::Sys.info()[["nodename"]]) [15:31:53.168] info <- base::sprintf("%s: %s", base::names(info), [15:31:53.168] info) [15:31:53.168] info <- base::paste(info, collapse = "; ") [15:31:53.168] if (!has_future) { [15:31:53.168] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:53.168] info) [15:31:53.168] } [15:31:53.168] else { [15:31:53.168] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:53.168] info, version) [15:31:53.168] } [15:31:53.168] base::stop(msg) [15:31:53.168] } [15:31:53.168] }) [15:31:53.168] } [15:31:53.168] ...future.strategy.old <- future::plan("list") [15:31:53.168] options(future.plan = NULL) [15:31:53.168] Sys.unsetenv("R_FUTURE_PLAN") [15:31:53.168] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:53.168] } [15:31:53.168] ...future.workdir <- getwd() [15:31:53.168] } [15:31:53.168] ...future.oldOptions <- base::as.list(base::.Options) [15:31:53.168] ...future.oldEnvVars <- base::Sys.getenv() [15:31:53.168] } [15:31:53.168] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:53.168] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:53.168] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:53.168] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:53.168] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:53.168] future.stdout.windows.reencode = NULL, width = 80L) [15:31:53.168] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:53.168] base::names(...future.oldOptions)) [15:31:53.168] } [15:31:53.168] if (FALSE) { [15:31:53.168] } [15:31:53.168] else { [15:31:53.168] if (TRUE) { [15:31:53.168] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:53.168] open = "w") [15:31:53.168] } [15:31:53.168] else { [15:31:53.168] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:53.168] windows = "NUL", "/dev/null"), open = "w") [15:31:53.168] } [15:31:53.168] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:53.168] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:53.168] base::sink(type = "output", split = FALSE) [15:31:53.168] base::close(...future.stdout) [15:31:53.168] }, add = TRUE) [15:31:53.168] } [15:31:53.168] ...future.frame <- base::sys.nframe() [15:31:53.168] ...future.conditions <- base::list() [15:31:53.168] ...future.rng <- base::globalenv()$.Random.seed [15:31:53.168] if (FALSE) { [15:31:53.168] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:53.168] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:53.168] } [15:31:53.168] ...future.result <- base::tryCatch({ [15:31:53.168] base::withCallingHandlers({ [15:31:53.168] ...future.value <- base::withVisible(base::local({ [15:31:53.168] do.call(function(...) { [15:31:53.168] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.168] if (!identical(...future.globals.maxSize.org, [15:31:53.168] ...future.globals.maxSize)) { [15:31:53.168] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.168] on.exit(options(oopts), add = TRUE) [15:31:53.168] } [15:31:53.168] { [15:31:53.168] lapply(seq_along(...future.elements_ii), [15:31:53.168] FUN = function(jj) { [15:31:53.168] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.168] ...future.FUN(...future.X_jj, ...) [15:31:53.168] }) [15:31:53.168] } [15:31:53.168] }, args = future.call.arguments) [15:31:53.168] })) [15:31:53.168] future::FutureResult(value = ...future.value$value, [15:31:53.168] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:53.168] ...future.rng), globalenv = if (FALSE) [15:31:53.168] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:53.168] ...future.globalenv.names)) [15:31:53.168] else NULL, started = ...future.startTime, version = "1.8") [15:31:53.168] }, condition = base::local({ [15:31:53.168] c <- base::c [15:31:53.168] inherits <- base::inherits [15:31:53.168] invokeRestart <- base::invokeRestart [15:31:53.168] length <- base::length [15:31:53.168] list <- base::list [15:31:53.168] seq.int <- base::seq.int [15:31:53.168] signalCondition <- base::signalCondition [15:31:53.168] sys.calls <- base::sys.calls [15:31:53.168] `[[` <- base::`[[` [15:31:53.168] `+` <- base::`+` [15:31:53.168] `<<-` <- base::`<<-` [15:31:53.168] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:53.168] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:53.168] 3L)] [15:31:53.168] } [15:31:53.168] function(cond) { [15:31:53.168] is_error <- inherits(cond, "error") [15:31:53.168] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:53.168] NULL) [15:31:53.168] if (is_error) { [15:31:53.168] sessionInformation <- function() { [15:31:53.168] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:53.168] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:53.168] search = base::search(), system = base::Sys.info()) [15:31:53.168] } [15:31:53.168] ...future.conditions[[length(...future.conditions) + [15:31:53.168] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:53.168] cond$call), session = sessionInformation(), [15:31:53.168] timestamp = base::Sys.time(), signaled = 0L) [15:31:53.168] signalCondition(cond) [15:31:53.168] } [15:31:53.168] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:53.168] "immediateCondition"))) { [15:31:53.168] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:53.168] ...future.conditions[[length(...future.conditions) + [15:31:53.168] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:53.168] if (TRUE && !signal) { [15:31:53.168] muffleCondition <- function (cond, pattern = "^muffle") [15:31:53.168] { [15:31:53.168] inherits <- base::inherits [15:31:53.168] invokeRestart <- base::invokeRestart [15:31:53.168] is.null <- base::is.null [15:31:53.168] muffled <- FALSE [15:31:53.168] if (inherits(cond, "message")) { [15:31:53.168] muffled <- grepl(pattern, "muffleMessage") [15:31:53.168] if (muffled) [15:31:53.168] invokeRestart("muffleMessage") [15:31:53.168] } [15:31:53.168] else if (inherits(cond, "warning")) { [15:31:53.168] muffled <- grepl(pattern, "muffleWarning") [15:31:53.168] if (muffled) [15:31:53.168] invokeRestart("muffleWarning") [15:31:53.168] } [15:31:53.168] else if (inherits(cond, "condition")) { [15:31:53.168] if (!is.null(pattern)) { [15:31:53.168] computeRestarts <- base::computeRestarts [15:31:53.168] grepl <- base::grepl [15:31:53.168] restarts <- computeRestarts(cond) [15:31:53.168] for (restart in restarts) { [15:31:53.168] name <- restart$name [15:31:53.168] if (is.null(name)) [15:31:53.168] next [15:31:53.168] if (!grepl(pattern, name)) [15:31:53.168] next [15:31:53.168] invokeRestart(restart) [15:31:53.168] muffled <- TRUE [15:31:53.168] break [15:31:53.168] } [15:31:53.168] } [15:31:53.168] } [15:31:53.168] invisible(muffled) [15:31:53.168] } [15:31:53.168] muffleCondition(cond, pattern = "^muffle") [15:31:53.168] } [15:31:53.168] } [15:31:53.168] else { [15:31:53.168] if (TRUE) { [15:31:53.168] muffleCondition <- function (cond, pattern = "^muffle") [15:31:53.168] { [15:31:53.168] inherits <- base::inherits [15:31:53.168] invokeRestart <- base::invokeRestart [15:31:53.168] is.null <- base::is.null [15:31:53.168] muffled <- FALSE [15:31:53.168] if (inherits(cond, "message")) { [15:31:53.168] muffled <- grepl(pattern, "muffleMessage") [15:31:53.168] if (muffled) [15:31:53.168] invokeRestart("muffleMessage") [15:31:53.168] } [15:31:53.168] else if (inherits(cond, "warning")) { [15:31:53.168] muffled <- grepl(pattern, "muffleWarning") [15:31:53.168] if (muffled) [15:31:53.168] invokeRestart("muffleWarning") [15:31:53.168] } [15:31:53.168] else if (inherits(cond, "condition")) { [15:31:53.168] if (!is.null(pattern)) { [15:31:53.168] computeRestarts <- base::computeRestarts [15:31:53.168] grepl <- base::grepl [15:31:53.168] restarts <- computeRestarts(cond) [15:31:53.168] for (restart in restarts) { [15:31:53.168] name <- restart$name [15:31:53.168] if (is.null(name)) [15:31:53.168] next [15:31:53.168] if (!grepl(pattern, name)) [15:31:53.168] next [15:31:53.168] invokeRestart(restart) [15:31:53.168] muffled <- TRUE [15:31:53.168] break [15:31:53.168] } [15:31:53.168] } [15:31:53.168] } [15:31:53.168] invisible(muffled) [15:31:53.168] } [15:31:53.168] muffleCondition(cond, pattern = "^muffle") [15:31:53.168] } [15:31:53.168] } [15:31:53.168] } [15:31:53.168] })) [15:31:53.168] }, error = function(ex) { [15:31:53.168] base::structure(base::list(value = NULL, visible = NULL, [15:31:53.168] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:53.168] ...future.rng), started = ...future.startTime, [15:31:53.168] finished = Sys.time(), session_uuid = NA_character_, [15:31:53.168] version = "1.8"), class = "FutureResult") [15:31:53.168] }, finally = { [15:31:53.168] if (!identical(...future.workdir, getwd())) [15:31:53.168] setwd(...future.workdir) [15:31:53.168] { [15:31:53.168] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:53.168] ...future.oldOptions$nwarnings <- NULL [15:31:53.168] } [15:31:53.168] base::options(...future.oldOptions) [15:31:53.168] if (.Platform$OS.type == "windows") { [15:31:53.168] old_names <- names(...future.oldEnvVars) [15:31:53.168] envs <- base::Sys.getenv() [15:31:53.168] names <- names(envs) [15:31:53.168] common <- intersect(names, old_names) [15:31:53.168] added <- setdiff(names, old_names) [15:31:53.168] removed <- setdiff(old_names, names) [15:31:53.168] changed <- common[...future.oldEnvVars[common] != [15:31:53.168] envs[common]] [15:31:53.168] NAMES <- toupper(changed) [15:31:53.168] args <- list() [15:31:53.168] for (kk in seq_along(NAMES)) { [15:31:53.168] name <- changed[[kk]] [15:31:53.168] NAME <- NAMES[[kk]] [15:31:53.168] if (name != NAME && is.element(NAME, old_names)) [15:31:53.168] next [15:31:53.168] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:53.168] } [15:31:53.168] NAMES <- toupper(added) [15:31:53.168] for (kk in seq_along(NAMES)) { [15:31:53.168] name <- added[[kk]] [15:31:53.168] NAME <- NAMES[[kk]] [15:31:53.168] if (name != NAME && is.element(NAME, old_names)) [15:31:53.168] next [15:31:53.168] args[[name]] <- "" [15:31:53.168] } [15:31:53.168] NAMES <- toupper(removed) [15:31:53.168] for (kk in seq_along(NAMES)) { [15:31:53.168] name <- removed[[kk]] [15:31:53.168] NAME <- NAMES[[kk]] [15:31:53.168] if (name != NAME && is.element(NAME, old_names)) [15:31:53.168] next [15:31:53.168] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:53.168] } [15:31:53.168] if (length(args) > 0) [15:31:53.168] base::do.call(base::Sys.setenv, args = args) [15:31:53.168] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:53.168] } [15:31:53.168] else { [15:31:53.168] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:53.168] } [15:31:53.168] { [15:31:53.168] if (base::length(...future.futureOptionsAdded) > [15:31:53.168] 0L) { [15:31:53.168] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:53.168] base::names(opts) <- ...future.futureOptionsAdded [15:31:53.168] base::options(opts) [15:31:53.168] } [15:31:53.168] { [15:31:53.168] { [15:31:53.168] NULL [15:31:53.168] RNGkind("Mersenne-Twister") [15:31:53.168] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:53.168] inherits = FALSE) [15:31:53.168] } [15:31:53.168] options(future.plan = NULL) [15:31:53.168] if (is.na(NA_character_)) [15:31:53.168] Sys.unsetenv("R_FUTURE_PLAN") [15:31:53.168] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:53.168] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:53.168] .init = FALSE) [15:31:53.168] } [15:31:53.168] } [15:31:53.168] } [15:31:53.168] }) [15:31:53.168] if (TRUE) { [15:31:53.168] base::sink(type = "output", split = FALSE) [15:31:53.168] if (TRUE) { [15:31:53.168] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:53.168] } [15:31:53.168] else { [15:31:53.168] ...future.result["stdout"] <- base::list(NULL) [15:31:53.168] } [15:31:53.168] base::close(...future.stdout) [15:31:53.168] ...future.stdout <- NULL [15:31:53.168] } [15:31:53.168] ...future.result$conditions <- ...future.conditions [15:31:53.168] ...future.result$finished <- base::Sys.time() [15:31:53.168] ...future.result [15:31:53.168] } [15:31:53.172] assign_globals() ... [15:31:53.172] List of 5 [15:31:53.172] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:53.172] $ future.call.arguments :List of 1 [15:31:53.172] ..$ length: int 2 [15:31:53.172] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.172] $ ...future.elements_ii :List of 4 [15:31:53.172] ..$ b: chr "numeric" [15:31:53.172] ..$ c: chr "character" [15:31:53.172] ..$ c: chr "list" [15:31:53.172] ..$ a: chr "integer" [15:31:53.172] $ ...future.seeds_ii : NULL [15:31:53.172] $ ...future.globals.maxSize: NULL [15:31:53.172] - attr(*, "where")=List of 5 [15:31:53.172] ..$ ...future.FUN : [15:31:53.172] ..$ future.call.arguments : [15:31:53.172] ..$ ...future.elements_ii : [15:31:53.172] ..$ ...future.seeds_ii : [15:31:53.172] ..$ ...future.globals.maxSize: [15:31:53.172] - attr(*, "resolved")= logi FALSE [15:31:53.172] - attr(*, "total_size")= num 2240 [15:31:53.172] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.172] - attr(*, "already-done")= logi TRUE [15:31:53.179] - copied '...future.FUN' to environment [15:31:53.179] - copied 'future.call.arguments' to environment [15:31:53.180] - copied '...future.elements_ii' to environment [15:31:53.180] - copied '...future.seeds_ii' to environment [15:31:53.180] - copied '...future.globals.maxSize' to environment [15:31:53.180] assign_globals() ... done [15:31:53.181] plan(): Setting new future strategy stack: [15:31:53.181] List of future strategies: [15:31:53.181] 1. sequential: [15:31:53.181] - args: function (..., envir = parent.frame(), workers = "") [15:31:53.181] - tweaked: FALSE [15:31:53.181] - call: NULL [15:31:53.181] plan(): nbrOfWorkers() = 1 [15:31:53.183] plan(): Setting new future strategy stack: [15:31:53.183] List of future strategies: [15:31:53.183] 1. sequential: [15:31:53.183] - args: function (..., envir = parent.frame(), workers = "") [15:31:53.183] - tweaked: FALSE [15:31:53.183] - call: plan(strategy) [15:31:53.184] plan(): nbrOfWorkers() = 1 [15:31:53.184] SequentialFuture started (and completed) [15:31:53.184] - Launch lazy future ... done [15:31:53.184] run() for 'SequentialFuture' ... done [15:31:53.185] Created future: [15:31:53.185] SequentialFuture: [15:31:53.185] Label: 'future_lapply-1' [15:31:53.185] Expression: [15:31:53.185] { [15:31:53.185] do.call(function(...) { [15:31:53.185] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.185] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:53.185] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.185] on.exit(options(oopts), add = TRUE) [15:31:53.185] } [15:31:53.185] { [15:31:53.185] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:53.185] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.185] ...future.FUN(...future.X_jj, ...) [15:31:53.185] }) [15:31:53.185] } [15:31:53.185] }, args = future.call.arguments) [15:31:53.185] } [15:31:53.185] Lazy evaluation: FALSE [15:31:53.185] Asynchronous evaluation: FALSE [15:31:53.185] Local evaluation: TRUE [15:31:53.185] Environment: R_GlobalEnv [15:31:53.185] Capture standard output: TRUE [15:31:53.185] Capture condition classes: 'condition' (excluding 'nothing') [15:31:53.185] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:53.185] Packages: [15:31:53.185] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:53.185] Resolved: TRUE [15:31:53.185] Value: 240 bytes of class 'list' [15:31:53.185] Early signaling: FALSE [15:31:53.185] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:53.185] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:53.186] Chunk #1 of 1 ... DONE [15:31:53.187] Launching 1 futures (chunks) ... DONE [15:31:53.187] Resolving 1 futures (chunks) ... [15:31:53.187] resolve() on list ... [15:31:53.187] recursive: 0 [15:31:53.187] length: 1 [15:31:53.188] [15:31:53.188] resolved() for 'SequentialFuture' ... [15:31:53.188] - state: 'finished' [15:31:53.188] - run: TRUE [15:31:53.188] - result: 'FutureResult' [15:31:53.189] resolved() for 'SequentialFuture' ... done [15:31:53.189] Future #1 [15:31:53.189] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:53.189] - nx: 1 [15:31:53.189] - relay: TRUE [15:31:53.189] - stdout: TRUE [15:31:53.190] - signal: TRUE [15:31:53.190] - resignal: FALSE [15:31:53.190] - force: TRUE [15:31:53.190] - relayed: [n=1] FALSE [15:31:53.190] - queued futures: [n=1] FALSE [15:31:53.190] - until=1 [15:31:53.191] - relaying element #1 [15:31:53.191] - relayed: [n=1] TRUE [15:31:53.191] - queued futures: [n=1] TRUE [15:31:53.191] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:53.191] length: 0 (resolved future 1) [15:31:53.192] Relaying remaining futures [15:31:53.192] signalConditionsASAP(NULL, pos=0) ... [15:31:53.192] - nx: 1 [15:31:53.192] - relay: TRUE [15:31:53.192] - stdout: TRUE [15:31:53.192] - signal: TRUE [15:31:53.193] - resignal: FALSE [15:31:53.193] - force: TRUE [15:31:53.193] - relayed: [n=1] TRUE [15:31:53.193] - queued futures: [n=1] TRUE - flush all [15:31:53.193] - relayed: [n=1] TRUE [15:31:53.193] - queued futures: [n=1] TRUE [15:31:53.194] signalConditionsASAP(NULL, pos=0) ... done [15:31:53.194] resolve() on list ... DONE [15:31:53.194] - Number of value chunks collected: 1 [15:31:53.194] Resolving 1 futures (chunks) ... DONE [15:31:53.194] Reducing values from 1 chunks ... [15:31:53.195] - Number of values collected after concatenation: 4 [15:31:53.195] - Number of values expected: 4 [15:31:53.195] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 1, 2, 3 [15:31:53.195] Reducing values from 1 chunks ... DONE [15:31:53.195] 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, ...) ... [15:31:53.198] future_lapply() ... [15:31:53.215] Number of chunks: 1 [15:31:53.216] getGlobalsAndPackagesXApply() ... [15:31:53.216] - future.globals: TRUE [15:31:53.216] getGlobalsAndPackages() ... [15:31:53.217] Searching for globals... [15:31:53.233] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [15:31:53.233] Searching for globals ... DONE [15:31:53.234] Resolving globals: FALSE [15:31:53.235] The total size of the 1 globals is 69.62 KiB (71288 bytes) [15:31:53.236] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 69.62 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (69.62 KiB of class 'function') [15:31:53.237] - globals: [1] 'FUN' [15:31:53.237] - packages: [1] 'future' [15:31:53.237] getGlobalsAndPackages() ... DONE [15:31:53.237] - globals found/used: [n=1] 'FUN' [15:31:53.238] - needed namespaces: [n=1] 'future' [15:31:53.238] Finding globals ... DONE [15:31:53.238] - use_args: TRUE [15:31:53.239] - Getting '...' globals ... [15:31:53.239] resolve() on list ... [15:31:53.240] recursive: 0 [15:31:53.240] length: 1 [15:31:53.240] elements: '...' [15:31:53.241] length: 0 (resolved future 1) [15:31:53.241] resolve() on list ... DONE [15:31:53.241] - '...' content: [n=2] 'collapse', 'maxHead' [15:31:53.241] List of 1 [15:31:53.241] $ ...:List of 2 [15:31:53.241] ..$ collapse: chr "; " [15:31:53.241] ..$ maxHead : int 3 [15:31:53.241] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.241] - attr(*, "where")=List of 1 [15:31:53.241] ..$ ...: [15:31:53.241] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.241] - attr(*, "resolved")= logi TRUE [15:31:53.241] - attr(*, "total_size")= num NA [15:31:53.248] - Getting '...' globals ... DONE [15:31:53.248] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:53.248] List of 2 [15:31:53.248] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:53.248] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:53.248] $ ... :List of 2 [15:31:53.248] ..$ collapse: chr "; " [15:31:53.248] ..$ maxHead : int 3 [15:31:53.248] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.248] - attr(*, "where")=List of 2 [15:31:53.248] ..$ ...future.FUN: [15:31:53.248] ..$ ... : [15:31:53.248] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.248] - attr(*, "resolved")= logi FALSE [15:31:53.248] - attr(*, "total_size")= num 71456 [15:31:53.255] Packages to be attached in all futures: [n=1] 'future' [15:31:53.256] getGlobalsAndPackagesXApply() ... DONE [15:31:53.256] Number of futures (= number of chunks): 1 [15:31:53.256] Launching 1 futures (chunks) ... [15:31:53.257] Chunk #1 of 1 ... [15:31:53.257] - Finding globals in 'X' for chunk #1 ... [15:31:53.257] getGlobalsAndPackages() ... [15:31:53.258] Searching for globals... [15:31:53.258] [15:31:53.259] Searching for globals ... DONE [15:31:53.259] - globals: [0] [15:31:53.259] getGlobalsAndPackages() ... DONE [15:31:53.259] + additional globals found: [n=0] [15:31:53.260] + additional namespaces needed: [n=0] [15:31:53.260] - Finding globals in 'X' for chunk #1 ... DONE [15:31:53.260] - seeds: [15:31:53.261] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.261] getGlobalsAndPackages() ... [15:31:53.262] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.262] Resolving globals: FALSE [15:31:53.262] Tweak future expression to call with '...' arguments ... [15:31:53.263] { [15:31:53.263] do.call(function(...) { [15:31:53.263] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.263] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:53.263] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.263] on.exit(options(oopts), add = TRUE) [15:31:53.263] } [15:31:53.263] { [15:31:53.263] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:53.263] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.263] ...future.FUN(...future.X_jj, ...) [15:31:53.263] }) [15:31:53.263] } [15:31:53.263] }, args = future.call.arguments) [15:31:53.263] } [15:31:53.264] Tweak future expression to call with '...' arguments ... DONE [15:31:53.265] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.265] - packages: [1] 'future' [15:31:53.266] getGlobalsAndPackages() ... DONE [15:31:53.266] run() for 'Future' ... [15:31:53.267] - state: 'created' [15:31:53.267] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:53.268] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:53.268] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:53.269] - Field: 'label' [15:31:53.269] - Field: 'local' [15:31:53.269] - Field: 'owner' [15:31:53.270] - Field: 'envir' [15:31:53.270] - Field: 'packages' [15:31:53.270] - Field: 'gc' [15:31:53.271] - Field: 'conditions' [15:31:53.271] - Field: 'expr' [15:31:53.272] - Field: 'uuid' [15:31:53.272] - Field: 'seed' [15:31:53.272] - Field: 'version' [15:31:53.273] - Field: 'result' [15:31:53.273] - Field: 'asynchronous' [15:31:53.273] - Field: 'calls' [15:31:53.274] - Field: 'globals' [15:31:53.274] - Field: 'stdout' [15:31:53.274] - Field: 'earlySignal' [15:31:53.275] - Field: 'lazy' [15:31:53.275] - Field: 'state' [15:31:53.275] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:53.276] - Launch lazy future ... [15:31:53.276] Packages needed by the future expression (n = 1): 'future' [15:31:53.277] Packages needed by future strategies (n = 0): [15:31:53.278] { [15:31:53.278] { [15:31:53.278] { [15:31:53.278] ...future.startTime <- base::Sys.time() [15:31:53.278] { [15:31:53.278] { [15:31:53.278] { [15:31:53.278] { [15:31:53.278] base::local({ [15:31:53.278] has_future <- base::requireNamespace("future", [15:31:53.278] quietly = TRUE) [15:31:53.278] if (has_future) { [15:31:53.278] ns <- base::getNamespace("future") [15:31:53.278] version <- ns[[".package"]][["version"]] [15:31:53.278] if (is.null(version)) [15:31:53.278] version <- utils::packageVersion("future") [15:31:53.278] } [15:31:53.278] else { [15:31:53.278] version <- NULL [15:31:53.278] } [15:31:53.278] if (!has_future || version < "1.8.0") { [15:31:53.278] info <- base::c(r_version = base::gsub("R version ", [15:31:53.278] "", base::R.version$version.string), [15:31:53.278] platform = base::sprintf("%s (%s-bit)", [15:31:53.278] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:53.278] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:53.278] "release", "version")], collapse = " "), [15:31:53.278] hostname = base::Sys.info()[["nodename"]]) [15:31:53.278] info <- base::sprintf("%s: %s", base::names(info), [15:31:53.278] info) [15:31:53.278] info <- base::paste(info, collapse = "; ") [15:31:53.278] if (!has_future) { [15:31:53.278] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:53.278] info) [15:31:53.278] } [15:31:53.278] else { [15:31:53.278] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:53.278] info, version) [15:31:53.278] } [15:31:53.278] base::stop(msg) [15:31:53.278] } [15:31:53.278] }) [15:31:53.278] } [15:31:53.278] base::local({ [15:31:53.278] for (pkg in "future") { [15:31:53.278] base::loadNamespace(pkg) [15:31:53.278] base::library(pkg, character.only = TRUE) [15:31:53.278] } [15:31:53.278] }) [15:31:53.278] } [15:31:53.278] ...future.strategy.old <- future::plan("list") [15:31:53.278] options(future.plan = NULL) [15:31:53.278] Sys.unsetenv("R_FUTURE_PLAN") [15:31:53.278] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:53.278] } [15:31:53.278] ...future.workdir <- getwd() [15:31:53.278] } [15:31:53.278] ...future.oldOptions <- base::as.list(base::.Options) [15:31:53.278] ...future.oldEnvVars <- base::Sys.getenv() [15:31:53.278] } [15:31:53.278] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:53.278] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:53.278] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:53.278] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:53.278] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:53.278] future.stdout.windows.reencode = NULL, width = 80L) [15:31:53.278] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:53.278] base::names(...future.oldOptions)) [15:31:53.278] } [15:31:53.278] if (FALSE) { [15:31:53.278] } [15:31:53.278] else { [15:31:53.278] if (TRUE) { [15:31:53.278] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:53.278] open = "w") [15:31:53.278] } [15:31:53.278] else { [15:31:53.278] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:53.278] windows = "NUL", "/dev/null"), open = "w") [15:31:53.278] } [15:31:53.278] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:53.278] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:53.278] base::sink(type = "output", split = FALSE) [15:31:53.278] base::close(...future.stdout) [15:31:53.278] }, add = TRUE) [15:31:53.278] } [15:31:53.278] ...future.frame <- base::sys.nframe() [15:31:53.278] ...future.conditions <- base::list() [15:31:53.278] ...future.rng <- base::globalenv()$.Random.seed [15:31:53.278] if (FALSE) { [15:31:53.278] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:53.278] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:53.278] } [15:31:53.278] ...future.result <- base::tryCatch({ [15:31:53.278] base::withCallingHandlers({ [15:31:53.278] ...future.value <- base::withVisible(base::local({ [15:31:53.278] do.call(function(...) { [15:31:53.278] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.278] if (!identical(...future.globals.maxSize.org, [15:31:53.278] ...future.globals.maxSize)) { [15:31:53.278] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.278] on.exit(options(oopts), add = TRUE) [15:31:53.278] } [15:31:53.278] { [15:31:53.278] lapply(seq_along(...future.elements_ii), [15:31:53.278] FUN = function(jj) { [15:31:53.278] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.278] ...future.FUN(...future.X_jj, ...) [15:31:53.278] }) [15:31:53.278] } [15:31:53.278] }, args = future.call.arguments) [15:31:53.278] })) [15:31:53.278] future::FutureResult(value = ...future.value$value, [15:31:53.278] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:53.278] ...future.rng), globalenv = if (FALSE) [15:31:53.278] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:53.278] ...future.globalenv.names)) [15:31:53.278] else NULL, started = ...future.startTime, version = "1.8") [15:31:53.278] }, condition = base::local({ [15:31:53.278] c <- base::c [15:31:53.278] inherits <- base::inherits [15:31:53.278] invokeRestart <- base::invokeRestart [15:31:53.278] length <- base::length [15:31:53.278] list <- base::list [15:31:53.278] seq.int <- base::seq.int [15:31:53.278] signalCondition <- base::signalCondition [15:31:53.278] sys.calls <- base::sys.calls [15:31:53.278] `[[` <- base::`[[` [15:31:53.278] `+` <- base::`+` [15:31:53.278] `<<-` <- base::`<<-` [15:31:53.278] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:53.278] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:53.278] 3L)] [15:31:53.278] } [15:31:53.278] function(cond) { [15:31:53.278] is_error <- inherits(cond, "error") [15:31:53.278] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:53.278] NULL) [15:31:53.278] if (is_error) { [15:31:53.278] sessionInformation <- function() { [15:31:53.278] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:53.278] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:53.278] search = base::search(), system = base::Sys.info()) [15:31:53.278] } [15:31:53.278] ...future.conditions[[length(...future.conditions) + [15:31:53.278] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:53.278] cond$call), session = sessionInformation(), [15:31:53.278] timestamp = base::Sys.time(), signaled = 0L) [15:31:53.278] signalCondition(cond) [15:31:53.278] } [15:31:53.278] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:53.278] "immediateCondition"))) { [15:31:53.278] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:53.278] ...future.conditions[[length(...future.conditions) + [15:31:53.278] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:53.278] if (TRUE && !signal) { [15:31:53.278] muffleCondition <- function (cond, pattern = "^muffle") [15:31:53.278] { [15:31:53.278] inherits <- base::inherits [15:31:53.278] invokeRestart <- base::invokeRestart [15:31:53.278] is.null <- base::is.null [15:31:53.278] muffled <- FALSE [15:31:53.278] if (inherits(cond, "message")) { [15:31:53.278] muffled <- grepl(pattern, "muffleMessage") [15:31:53.278] if (muffled) [15:31:53.278] invokeRestart("muffleMessage") [15:31:53.278] } [15:31:53.278] else if (inherits(cond, "warning")) { [15:31:53.278] muffled <- grepl(pattern, "muffleWarning") [15:31:53.278] if (muffled) [15:31:53.278] invokeRestart("muffleWarning") [15:31:53.278] } [15:31:53.278] else if (inherits(cond, "condition")) { [15:31:53.278] if (!is.null(pattern)) { [15:31:53.278] computeRestarts <- base::computeRestarts [15:31:53.278] grepl <- base::grepl [15:31:53.278] restarts <- computeRestarts(cond) [15:31:53.278] for (restart in restarts) { [15:31:53.278] name <- restart$name [15:31:53.278] if (is.null(name)) [15:31:53.278] next [15:31:53.278] if (!grepl(pattern, name)) [15:31:53.278] next [15:31:53.278] invokeRestart(restart) [15:31:53.278] muffled <- TRUE [15:31:53.278] break [15:31:53.278] } [15:31:53.278] } [15:31:53.278] } [15:31:53.278] invisible(muffled) [15:31:53.278] } [15:31:53.278] muffleCondition(cond, pattern = "^muffle") [15:31:53.278] } [15:31:53.278] } [15:31:53.278] else { [15:31:53.278] if (TRUE) { [15:31:53.278] muffleCondition <- function (cond, pattern = "^muffle") [15:31:53.278] { [15:31:53.278] inherits <- base::inherits [15:31:53.278] invokeRestart <- base::invokeRestart [15:31:53.278] is.null <- base::is.null [15:31:53.278] muffled <- FALSE [15:31:53.278] if (inherits(cond, "message")) { [15:31:53.278] muffled <- grepl(pattern, "muffleMessage") [15:31:53.278] if (muffled) [15:31:53.278] invokeRestart("muffleMessage") [15:31:53.278] } [15:31:53.278] else if (inherits(cond, "warning")) { [15:31:53.278] muffled <- grepl(pattern, "muffleWarning") [15:31:53.278] if (muffled) [15:31:53.278] invokeRestart("muffleWarning") [15:31:53.278] } [15:31:53.278] else if (inherits(cond, "condition")) { [15:31:53.278] if (!is.null(pattern)) { [15:31:53.278] computeRestarts <- base::computeRestarts [15:31:53.278] grepl <- base::grepl [15:31:53.278] restarts <- computeRestarts(cond) [15:31:53.278] for (restart in restarts) { [15:31:53.278] name <- restart$name [15:31:53.278] if (is.null(name)) [15:31:53.278] next [15:31:53.278] if (!grepl(pattern, name)) [15:31:53.278] next [15:31:53.278] invokeRestart(restart) [15:31:53.278] muffled <- TRUE [15:31:53.278] break [15:31:53.278] } [15:31:53.278] } [15:31:53.278] } [15:31:53.278] invisible(muffled) [15:31:53.278] } [15:31:53.278] muffleCondition(cond, pattern = "^muffle") [15:31:53.278] } [15:31:53.278] } [15:31:53.278] } [15:31:53.278] })) [15:31:53.278] }, error = function(ex) { [15:31:53.278] base::structure(base::list(value = NULL, visible = NULL, [15:31:53.278] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:53.278] ...future.rng), started = ...future.startTime, [15:31:53.278] finished = Sys.time(), session_uuid = NA_character_, [15:31:53.278] version = "1.8"), class = "FutureResult") [15:31:53.278] }, finally = { [15:31:53.278] if (!identical(...future.workdir, getwd())) [15:31:53.278] setwd(...future.workdir) [15:31:53.278] { [15:31:53.278] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:53.278] ...future.oldOptions$nwarnings <- NULL [15:31:53.278] } [15:31:53.278] base::options(...future.oldOptions) [15:31:53.278] if (.Platform$OS.type == "windows") { [15:31:53.278] old_names <- names(...future.oldEnvVars) [15:31:53.278] envs <- base::Sys.getenv() [15:31:53.278] names <- names(envs) [15:31:53.278] common <- intersect(names, old_names) [15:31:53.278] added <- setdiff(names, old_names) [15:31:53.278] removed <- setdiff(old_names, names) [15:31:53.278] changed <- common[...future.oldEnvVars[common] != [15:31:53.278] envs[common]] [15:31:53.278] NAMES <- toupper(changed) [15:31:53.278] args <- list() [15:31:53.278] for (kk in seq_along(NAMES)) { [15:31:53.278] name <- changed[[kk]] [15:31:53.278] NAME <- NAMES[[kk]] [15:31:53.278] if (name != NAME && is.element(NAME, old_names)) [15:31:53.278] next [15:31:53.278] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:53.278] } [15:31:53.278] NAMES <- toupper(added) [15:31:53.278] for (kk in seq_along(NAMES)) { [15:31:53.278] name <- added[[kk]] [15:31:53.278] NAME <- NAMES[[kk]] [15:31:53.278] if (name != NAME && is.element(NAME, old_names)) [15:31:53.278] next [15:31:53.278] args[[name]] <- "" [15:31:53.278] } [15:31:53.278] NAMES <- toupper(removed) [15:31:53.278] for (kk in seq_along(NAMES)) { [15:31:53.278] name <- removed[[kk]] [15:31:53.278] NAME <- NAMES[[kk]] [15:31:53.278] if (name != NAME && is.element(NAME, old_names)) [15:31:53.278] next [15:31:53.278] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:53.278] } [15:31:53.278] if (length(args) > 0) [15:31:53.278] base::do.call(base::Sys.setenv, args = args) [15:31:53.278] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:53.278] } [15:31:53.278] else { [15:31:53.278] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:53.278] } [15:31:53.278] { [15:31:53.278] if (base::length(...future.futureOptionsAdded) > [15:31:53.278] 0L) { [15:31:53.278] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:53.278] base::names(opts) <- ...future.futureOptionsAdded [15:31:53.278] base::options(opts) [15:31:53.278] } [15:31:53.278] { [15:31:53.278] { [15:31:53.278] NULL [15:31:53.278] RNGkind("Mersenne-Twister") [15:31:53.278] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:53.278] inherits = FALSE) [15:31:53.278] } [15:31:53.278] options(future.plan = NULL) [15:31:53.278] if (is.na(NA_character_)) [15:31:53.278] Sys.unsetenv("R_FUTURE_PLAN") [15:31:53.278] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:53.278] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:53.278] .init = FALSE) [15:31:53.278] } [15:31:53.278] } [15:31:53.278] } [15:31:53.278] }) [15:31:53.278] if (TRUE) { [15:31:53.278] base::sink(type = "output", split = FALSE) [15:31:53.278] if (TRUE) { [15:31:53.278] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:53.278] } [15:31:53.278] else { [15:31:53.278] ...future.result["stdout"] <- base::list(NULL) [15:31:53.278] } [15:31:53.278] base::close(...future.stdout) [15:31:53.278] ...future.stdout <- NULL [15:31:53.278] } [15:31:53.278] ...future.result$conditions <- ...future.conditions [15:31:53.278] ...future.result$finished <- base::Sys.time() [15:31:53.278] ...future.result [15:31:53.278] } [15:31:53.286] assign_globals() ... [15:31:53.287] List of 5 [15:31:53.287] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:53.287] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:53.287] $ future.call.arguments :List of 2 [15:31:53.287] ..$ collapse: chr "; " [15:31:53.287] ..$ maxHead : int 3 [15:31:53.287] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.287] $ ...future.elements_ii :List of 1 [15:31:53.287] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [15:31:53.287] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [15:31:53.287] $ ...future.seeds_ii : NULL [15:31:53.287] $ ...future.globals.maxSize: NULL [15:31:53.287] - attr(*, "where")=List of 5 [15:31:53.287] ..$ ...future.FUN : [15:31:53.287] ..$ future.call.arguments : [15:31:53.287] ..$ ...future.elements_ii : [15:31:53.287] ..$ ...future.seeds_ii : [15:31:53.287] ..$ ...future.globals.maxSize: [15:31:53.287] - attr(*, "resolved")= logi FALSE [15:31:53.287] - attr(*, "total_size")= num 71456 [15:31:53.287] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.287] - attr(*, "already-done")= logi TRUE [15:31:53.300] - copied '...future.FUN' to environment [15:31:53.300] - copied 'future.call.arguments' to environment [15:31:53.301] - copied '...future.elements_ii' to environment [15:31:53.301] - copied '...future.seeds_ii' to environment [15:31:53.301] - copied '...future.globals.maxSize' to environment [15:31:53.302] assign_globals() ... done [15:31:53.303] plan(): Setting new future strategy stack: [15:31:53.303] List of future strategies: [15:31:53.303] 1. sequential: [15:31:53.303] - args: function (..., envir = parent.frame(), workers = "") [15:31:53.303] - tweaked: FALSE [15:31:53.303] - call: NULL [15:31:53.304] plan(): nbrOfWorkers() = 1 [15:31:53.307] plan(): Setting new future strategy stack: [15:31:53.307] List of future strategies: [15:31:53.307] 1. sequential: [15:31:53.307] - args: function (..., envir = parent.frame(), workers = "") [15:31:53.307] - tweaked: FALSE [15:31:53.307] - call: plan(strategy) [15:31:53.308] plan(): nbrOfWorkers() = 1 [15:31:53.309] SequentialFuture started (and completed) [15:31:53.309] - Launch lazy future ... done [15:31:53.309] run() for 'SequentialFuture' ... done [15:31:53.310] Created future: [15:31:53.310] SequentialFuture: [15:31:53.310] Label: 'future_lapply-1' [15:31:53.310] Expression: [15:31:53.310] { [15:31:53.310] do.call(function(...) { [15:31:53.310] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.310] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:53.310] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.310] on.exit(options(oopts), add = TRUE) [15:31:53.310] } [15:31:53.310] { [15:31:53.310] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:53.310] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.310] ...future.FUN(...future.X_jj, ...) [15:31:53.310] }) [15:31:53.310] } [15:31:53.310] }, args = future.call.arguments) [15:31:53.310] } [15:31:53.310] Lazy evaluation: FALSE [15:31:53.310] Asynchronous evaluation: FALSE [15:31:53.310] Local evaluation: TRUE [15:31:53.310] Environment: R_GlobalEnv [15:31:53.310] Capture standard output: TRUE [15:31:53.310] Capture condition classes: 'condition' (excluding 'nothing') [15:31:53.310] Globals: 5 objects totaling 82.61 KiB (function '...future.FUN' of 69.62 KiB, DotDotDotList 'future.call.arguments' of 168 bytes, list '...future.elements_ii' of 12.83 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:53.310] Packages: 1 packages ('future') [15:31:53.310] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:53.310] Resolved: TRUE [15:31:53.310] Value: 136 bytes of class 'list' [15:31:53.310] Early signaling: FALSE [15:31:53.310] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:53.310] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:53.313] Chunk #1 of 1 ... DONE [15:31:53.313] Launching 1 futures (chunks) ... DONE [15:31:53.313] Resolving 1 futures (chunks) ... [15:31:53.314] resolve() on list ... [15:31:53.314] recursive: 0 [15:31:53.314] length: 1 [15:31:53.315] [15:31:53.315] resolved() for 'SequentialFuture' ... [15:31:53.315] - state: 'finished' [15:31:53.316] - run: TRUE [15:31:53.316] - result: 'FutureResult' [15:31:53.317] resolved() for 'SequentialFuture' ... done [15:31:53.317] Future #1 [15:31:53.317] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:53.318] - nx: 1 [15:31:53.318] - relay: TRUE [15:31:53.318] - stdout: TRUE [15:31:53.319] - signal: TRUE [15:31:53.319] - resignal: FALSE [15:31:53.319] - force: TRUE [15:31:53.320] - relayed: [n=1] FALSE [15:31:53.320] - queued futures: [n=1] FALSE [15:31:53.320] - until=1 [15:31:53.321] - relaying element #1 [15:31:53.321] - relayed: [n=1] TRUE [15:31:53.322] - queued futures: [n=1] TRUE [15:31:53.322] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:53.322] length: 0 (resolved future 1) [15:31:53.323] Relaying remaining futures [15:31:53.323] signalConditionsASAP(NULL, pos=0) ... [15:31:53.323] - nx: 1 [15:31:53.323] - relay: TRUE [15:31:53.324] - stdout: TRUE [15:31:53.324] - signal: TRUE [15:31:53.324] - resignal: FALSE [15:31:53.325] - force: TRUE [15:31:53.325] - relayed: [n=1] TRUE [15:31:53.325] - queued futures: [n=1] TRUE - flush all [15:31:53.326] - relayed: [n=1] TRUE [15:31:53.326] - queued futures: [n=1] TRUE [15:31:53.326] signalConditionsASAP(NULL, pos=0) ... done [15:31:53.327] resolve() on list ... DONE [15:31:53.327] - Number of value chunks collected: 1 [15:31:53.328] Resolving 1 futures (chunks) ... DONE [15:31:53.328] Reducing values from 1 chunks ... [15:31:53.328] - Number of values collected after concatenation: 1 [15:31:53.329] - Number of values expected: 1 [15:31:53.329] Reducing values from 1 chunks ... DONE [15:31:53.329] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [15:31:53.331] future_lapply() ... [15:31:53.333] Number of chunks: 1 [15:31:53.333] Index remapping (attribute 'ordering'): [n = 2] 2, 1 [15:31:53.334] getGlobalsAndPackagesXApply() ... [15:31:53.334] - future.globals: TRUE [15:31:53.335] getGlobalsAndPackages() ... [15:31:53.335] Searching for globals... [15:31:53.338] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [15:31:53.338] Searching for globals ... DONE [15:31:53.338] Resolving globals: FALSE [15:31:53.339] The total size of the 1 globals is 4.85 KiB (4968 bytes) [15:31:53.340] The total size of the 1 globals exported for future expression ('FUN()') is 4.85 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (4.85 KiB of class 'function') [15:31:53.340] - globals: [1] 'FUN' [15:31:53.341] - packages: [1] 'listenv' [15:31:53.341] getGlobalsAndPackages() ... DONE [15:31:53.342] - globals found/used: [n=1] 'FUN' [15:31:53.342] - needed namespaces: [n=1] 'listenv' [15:31:53.342] Finding globals ... DONE [15:31:53.343] - use_args: TRUE [15:31:53.343] - Getting '...' globals ... [15:31:53.344] resolve() on list ... [15:31:53.344] recursive: 0 [15:31:53.344] length: 1 [15:31:53.345] elements: '...' [15:31:53.345] length: 0 (resolved future 1) [15:31:53.345] resolve() on list ... DONE [15:31:53.346] - '...' content: [n=0] [15:31:53.346] List of 1 [15:31:53.346] $ ...: list() [15:31:53.346] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.346] - attr(*, "where")=List of 1 [15:31:53.346] ..$ ...: [15:31:53.346] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.346] - attr(*, "resolved")= logi TRUE [15:31:53.346] - attr(*, "total_size")= num NA [15:31:53.352] - Getting '...' globals ... DONE [15:31:53.352] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:53.353] List of 2 [15:31:53.353] $ ...future.FUN:function (x, ...) [15:31:53.353] $ ... : list() [15:31:53.353] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.353] - attr(*, "where")=List of 2 [15:31:53.353] ..$ ...future.FUN: [15:31:53.353] ..$ ... : [15:31:53.353] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.353] - attr(*, "resolved")= logi FALSE [15:31:53.353] - attr(*, "total_size")= num 4968 [15:31:53.359] Packages to be attached in all futures: [n=1] 'listenv' [15:31:53.359] getGlobalsAndPackagesXApply() ... DONE [15:31:53.360] Number of futures (= number of chunks): 1 [15:31:53.360] Launching 1 futures (chunks) ... [15:31:53.360] Chunk #1 of 1 ... [15:31:53.361] - Finding globals in 'X' for chunk #1 ... [15:31:53.361] getGlobalsAndPackages() ... [15:31:53.361] Searching for globals... [15:31:53.362] [15:31:53.363] Searching for globals ... DONE [15:31:53.363] - globals: [0] [15:31:53.363] getGlobalsAndPackages() ... DONE [15:31:53.363] + additional globals found: [n=0] [15:31:53.364] + additional namespaces needed: [n=0] [15:31:53.364] - Finding globals in 'X' for chunk #1 ... DONE [15:31:53.364] - seeds: [15:31:53.364] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.365] getGlobalsAndPackages() ... [15:31:53.365] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.365] Resolving globals: FALSE [15:31:53.366] Tweak future expression to call with '...' arguments ... [15:31:53.366] { [15:31:53.366] do.call(function(...) { [15:31:53.366] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.366] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:53.366] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.366] on.exit(options(oopts), add = TRUE) [15:31:53.366] } [15:31:53.366] { [15:31:53.366] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:53.366] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.366] ...future.FUN(...future.X_jj, ...) [15:31:53.366] }) [15:31:53.366] } [15:31:53.366] }, args = future.call.arguments) [15:31:53.366] } [15:31:53.367] Tweak future expression to call with '...' arguments ... DONE [15:31:53.368] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.368] - packages: [1] 'listenv' [15:31:53.368] getGlobalsAndPackages() ... DONE [15:31:53.369] run() for 'Future' ... [15:31:53.369] - state: 'created' [15:31:53.369] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:53.370] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:53.370] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:53.371] - Field: 'label' [15:31:53.371] - Field: 'local' [15:31:53.371] - Field: 'owner' [15:31:53.372] - Field: 'envir' [15:31:53.372] - Field: 'packages' [15:31:53.372] - Field: 'gc' [15:31:53.373] - Field: 'conditions' [15:31:53.373] - Field: 'expr' [15:31:53.373] - Field: 'uuid' [15:31:53.373] - Field: 'seed' [15:31:53.374] - Field: 'version' [15:31:53.374] - Field: 'result' [15:31:53.374] - Field: 'asynchronous' [15:31:53.375] - Field: 'calls' [15:31:53.375] - Field: 'globals' [15:31:53.380] - Field: 'stdout' [15:31:53.380] - Field: 'earlySignal' [15:31:53.380] - Field: 'lazy' [15:31:53.381] - Field: 'state' [15:31:53.381] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:53.381] - Launch lazy future ... [15:31:53.382] Packages needed by the future expression (n = 1): 'listenv' [15:31:53.382] Packages needed by future strategies (n = 0): [15:31:53.383] { [15:31:53.383] { [15:31:53.383] { [15:31:53.383] ...future.startTime <- base::Sys.time() [15:31:53.383] { [15:31:53.383] { [15:31:53.383] { [15:31:53.383] { [15:31:53.383] base::local({ [15:31:53.383] has_future <- base::requireNamespace("future", [15:31:53.383] quietly = TRUE) [15:31:53.383] if (has_future) { [15:31:53.383] ns <- base::getNamespace("future") [15:31:53.383] version <- ns[[".package"]][["version"]] [15:31:53.383] if (is.null(version)) [15:31:53.383] version <- utils::packageVersion("future") [15:31:53.383] } [15:31:53.383] else { [15:31:53.383] version <- NULL [15:31:53.383] } [15:31:53.383] if (!has_future || version < "1.8.0") { [15:31:53.383] info <- base::c(r_version = base::gsub("R version ", [15:31:53.383] "", base::R.version$version.string), [15:31:53.383] platform = base::sprintf("%s (%s-bit)", [15:31:53.383] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:53.383] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:53.383] "release", "version")], collapse = " "), [15:31:53.383] hostname = base::Sys.info()[["nodename"]]) [15:31:53.383] info <- base::sprintf("%s: %s", base::names(info), [15:31:53.383] info) [15:31:53.383] info <- base::paste(info, collapse = "; ") [15:31:53.383] if (!has_future) { [15:31:53.383] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:53.383] info) [15:31:53.383] } [15:31:53.383] else { [15:31:53.383] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:53.383] info, version) [15:31:53.383] } [15:31:53.383] base::stop(msg) [15:31:53.383] } [15:31:53.383] }) [15:31:53.383] } [15:31:53.383] base::local({ [15:31:53.383] for (pkg in "listenv") { [15:31:53.383] base::loadNamespace(pkg) [15:31:53.383] base::library(pkg, character.only = TRUE) [15:31:53.383] } [15:31:53.383] }) [15:31:53.383] } [15:31:53.383] ...future.strategy.old <- future::plan("list") [15:31:53.383] options(future.plan = NULL) [15:31:53.383] Sys.unsetenv("R_FUTURE_PLAN") [15:31:53.383] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:53.383] } [15:31:53.383] ...future.workdir <- getwd() [15:31:53.383] } [15:31:53.383] ...future.oldOptions <- base::as.list(base::.Options) [15:31:53.383] ...future.oldEnvVars <- base::Sys.getenv() [15:31:53.383] } [15:31:53.383] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:53.383] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:53.383] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:53.383] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:53.383] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:53.383] future.stdout.windows.reencode = NULL, width = 80L) [15:31:53.383] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:53.383] base::names(...future.oldOptions)) [15:31:53.383] } [15:31:53.383] if (FALSE) { [15:31:53.383] } [15:31:53.383] else { [15:31:53.383] if (TRUE) { [15:31:53.383] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:53.383] open = "w") [15:31:53.383] } [15:31:53.383] else { [15:31:53.383] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:53.383] windows = "NUL", "/dev/null"), open = "w") [15:31:53.383] } [15:31:53.383] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:53.383] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:53.383] base::sink(type = "output", split = FALSE) [15:31:53.383] base::close(...future.stdout) [15:31:53.383] }, add = TRUE) [15:31:53.383] } [15:31:53.383] ...future.frame <- base::sys.nframe() [15:31:53.383] ...future.conditions <- base::list() [15:31:53.383] ...future.rng <- base::globalenv()$.Random.seed [15:31:53.383] if (FALSE) { [15:31:53.383] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:53.383] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:53.383] } [15:31:53.383] ...future.result <- base::tryCatch({ [15:31:53.383] base::withCallingHandlers({ [15:31:53.383] ...future.value <- base::withVisible(base::local({ [15:31:53.383] do.call(function(...) { [15:31:53.383] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.383] if (!identical(...future.globals.maxSize.org, [15:31:53.383] ...future.globals.maxSize)) { [15:31:53.383] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.383] on.exit(options(oopts), add = TRUE) [15:31:53.383] } [15:31:53.383] { [15:31:53.383] lapply(seq_along(...future.elements_ii), [15:31:53.383] FUN = function(jj) { [15:31:53.383] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.383] ...future.FUN(...future.X_jj, ...) [15:31:53.383] }) [15:31:53.383] } [15:31:53.383] }, args = future.call.arguments) [15:31:53.383] })) [15:31:53.383] future::FutureResult(value = ...future.value$value, [15:31:53.383] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:53.383] ...future.rng), globalenv = if (FALSE) [15:31:53.383] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:53.383] ...future.globalenv.names)) [15:31:53.383] else NULL, started = ...future.startTime, version = "1.8") [15:31:53.383] }, condition = base::local({ [15:31:53.383] c <- base::c [15:31:53.383] inherits <- base::inherits [15:31:53.383] invokeRestart <- base::invokeRestart [15:31:53.383] length <- base::length [15:31:53.383] list <- base::list [15:31:53.383] seq.int <- base::seq.int [15:31:53.383] signalCondition <- base::signalCondition [15:31:53.383] sys.calls <- base::sys.calls [15:31:53.383] `[[` <- base::`[[` [15:31:53.383] `+` <- base::`+` [15:31:53.383] `<<-` <- base::`<<-` [15:31:53.383] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:53.383] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:53.383] 3L)] [15:31:53.383] } [15:31:53.383] function(cond) { [15:31:53.383] is_error <- inherits(cond, "error") [15:31:53.383] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:53.383] NULL) [15:31:53.383] if (is_error) { [15:31:53.383] sessionInformation <- function() { [15:31:53.383] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:53.383] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:53.383] search = base::search(), system = base::Sys.info()) [15:31:53.383] } [15:31:53.383] ...future.conditions[[length(...future.conditions) + [15:31:53.383] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:53.383] cond$call), session = sessionInformation(), [15:31:53.383] timestamp = base::Sys.time(), signaled = 0L) [15:31:53.383] signalCondition(cond) [15:31:53.383] } [15:31:53.383] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:53.383] "immediateCondition"))) { [15:31:53.383] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:53.383] ...future.conditions[[length(...future.conditions) + [15:31:53.383] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:53.383] if (TRUE && !signal) { [15:31:53.383] muffleCondition <- function (cond, pattern = "^muffle") [15:31:53.383] { [15:31:53.383] inherits <- base::inherits [15:31:53.383] invokeRestart <- base::invokeRestart [15:31:53.383] is.null <- base::is.null [15:31:53.383] muffled <- FALSE [15:31:53.383] if (inherits(cond, "message")) { [15:31:53.383] muffled <- grepl(pattern, "muffleMessage") [15:31:53.383] if (muffled) [15:31:53.383] invokeRestart("muffleMessage") [15:31:53.383] } [15:31:53.383] else if (inherits(cond, "warning")) { [15:31:53.383] muffled <- grepl(pattern, "muffleWarning") [15:31:53.383] if (muffled) [15:31:53.383] invokeRestart("muffleWarning") [15:31:53.383] } [15:31:53.383] else if (inherits(cond, "condition")) { [15:31:53.383] if (!is.null(pattern)) { [15:31:53.383] computeRestarts <- base::computeRestarts [15:31:53.383] grepl <- base::grepl [15:31:53.383] restarts <- computeRestarts(cond) [15:31:53.383] for (restart in restarts) { [15:31:53.383] name <- restart$name [15:31:53.383] if (is.null(name)) [15:31:53.383] next [15:31:53.383] if (!grepl(pattern, name)) [15:31:53.383] next [15:31:53.383] invokeRestart(restart) [15:31:53.383] muffled <- TRUE [15:31:53.383] break [15:31:53.383] } [15:31:53.383] } [15:31:53.383] } [15:31:53.383] invisible(muffled) [15:31:53.383] } [15:31:53.383] muffleCondition(cond, pattern = "^muffle") [15:31:53.383] } [15:31:53.383] } [15:31:53.383] else { [15:31:53.383] if (TRUE) { [15:31:53.383] muffleCondition <- function (cond, pattern = "^muffle") [15:31:53.383] { [15:31:53.383] inherits <- base::inherits [15:31:53.383] invokeRestart <- base::invokeRestart [15:31:53.383] is.null <- base::is.null [15:31:53.383] muffled <- FALSE [15:31:53.383] if (inherits(cond, "message")) { [15:31:53.383] muffled <- grepl(pattern, "muffleMessage") [15:31:53.383] if (muffled) [15:31:53.383] invokeRestart("muffleMessage") [15:31:53.383] } [15:31:53.383] else if (inherits(cond, "warning")) { [15:31:53.383] muffled <- grepl(pattern, "muffleWarning") [15:31:53.383] if (muffled) [15:31:53.383] invokeRestart("muffleWarning") [15:31:53.383] } [15:31:53.383] else if (inherits(cond, "condition")) { [15:31:53.383] if (!is.null(pattern)) { [15:31:53.383] computeRestarts <- base::computeRestarts [15:31:53.383] grepl <- base::grepl [15:31:53.383] restarts <- computeRestarts(cond) [15:31:53.383] for (restart in restarts) { [15:31:53.383] name <- restart$name [15:31:53.383] if (is.null(name)) [15:31:53.383] next [15:31:53.383] if (!grepl(pattern, name)) [15:31:53.383] next [15:31:53.383] invokeRestart(restart) [15:31:53.383] muffled <- TRUE [15:31:53.383] break [15:31:53.383] } [15:31:53.383] } [15:31:53.383] } [15:31:53.383] invisible(muffled) [15:31:53.383] } [15:31:53.383] muffleCondition(cond, pattern = "^muffle") [15:31:53.383] } [15:31:53.383] } [15:31:53.383] } [15:31:53.383] })) [15:31:53.383] }, error = function(ex) { [15:31:53.383] base::structure(base::list(value = NULL, visible = NULL, [15:31:53.383] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:53.383] ...future.rng), started = ...future.startTime, [15:31:53.383] finished = Sys.time(), session_uuid = NA_character_, [15:31:53.383] version = "1.8"), class = "FutureResult") [15:31:53.383] }, finally = { [15:31:53.383] if (!identical(...future.workdir, getwd())) [15:31:53.383] setwd(...future.workdir) [15:31:53.383] { [15:31:53.383] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:53.383] ...future.oldOptions$nwarnings <- NULL [15:31:53.383] } [15:31:53.383] base::options(...future.oldOptions) [15:31:53.383] if (.Platform$OS.type == "windows") { [15:31:53.383] old_names <- names(...future.oldEnvVars) [15:31:53.383] envs <- base::Sys.getenv() [15:31:53.383] names <- names(envs) [15:31:53.383] common <- intersect(names, old_names) [15:31:53.383] added <- setdiff(names, old_names) [15:31:53.383] removed <- setdiff(old_names, names) [15:31:53.383] changed <- common[...future.oldEnvVars[common] != [15:31:53.383] envs[common]] [15:31:53.383] NAMES <- toupper(changed) [15:31:53.383] args <- list() [15:31:53.383] for (kk in seq_along(NAMES)) { [15:31:53.383] name <- changed[[kk]] [15:31:53.383] NAME <- NAMES[[kk]] [15:31:53.383] if (name != NAME && is.element(NAME, old_names)) [15:31:53.383] next [15:31:53.383] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:53.383] } [15:31:53.383] NAMES <- toupper(added) [15:31:53.383] for (kk in seq_along(NAMES)) { [15:31:53.383] name <- added[[kk]] [15:31:53.383] NAME <- NAMES[[kk]] [15:31:53.383] if (name != NAME && is.element(NAME, old_names)) [15:31:53.383] next [15:31:53.383] args[[name]] <- "" [15:31:53.383] } [15:31:53.383] NAMES <- toupper(removed) [15:31:53.383] for (kk in seq_along(NAMES)) { [15:31:53.383] name <- removed[[kk]] [15:31:53.383] NAME <- NAMES[[kk]] [15:31:53.383] if (name != NAME && is.element(NAME, old_names)) [15:31:53.383] next [15:31:53.383] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:53.383] } [15:31:53.383] if (length(args) > 0) [15:31:53.383] base::do.call(base::Sys.setenv, args = args) [15:31:53.383] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:53.383] } [15:31:53.383] else { [15:31:53.383] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:53.383] } [15:31:53.383] { [15:31:53.383] if (base::length(...future.futureOptionsAdded) > [15:31:53.383] 0L) { [15:31:53.383] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:53.383] base::names(opts) <- ...future.futureOptionsAdded [15:31:53.383] base::options(opts) [15:31:53.383] } [15:31:53.383] { [15:31:53.383] { [15:31:53.383] NULL [15:31:53.383] RNGkind("Mersenne-Twister") [15:31:53.383] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:53.383] inherits = FALSE) [15:31:53.383] } [15:31:53.383] options(future.plan = NULL) [15:31:53.383] if (is.na(NA_character_)) [15:31:53.383] Sys.unsetenv("R_FUTURE_PLAN") [15:31:53.383] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:53.383] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:53.383] .init = FALSE) [15:31:53.383] } [15:31:53.383] } [15:31:53.383] } [15:31:53.383] }) [15:31:53.383] if (TRUE) { [15:31:53.383] base::sink(type = "output", split = FALSE) [15:31:53.383] if (TRUE) { [15:31:53.383] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:53.383] } [15:31:53.383] else { [15:31:53.383] ...future.result["stdout"] <- base::list(NULL) [15:31:53.383] } [15:31:53.383] base::close(...future.stdout) [15:31:53.383] ...future.stdout <- NULL [15:31:53.383] } [15:31:53.383] ...future.result$conditions <- ...future.conditions [15:31:53.383] ...future.result$finished <- base::Sys.time() [15:31:53.383] ...future.result [15:31:53.383] } [15:31:53.390] assign_globals() ... [15:31:53.391] List of 5 [15:31:53.391] $ ...future.FUN :function (x, ...) [15:31:53.391] $ future.call.arguments : list() [15:31:53.391] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.391] $ ...future.elements_ii :List of 2 [15:31:53.391] ..$ b:Classes 'listenv', 'environment' [15:31:53.391] ..$ a:Classes 'listenv', 'environment' [15:31:53.391] $ ...future.seeds_ii : NULL [15:31:53.391] $ ...future.globals.maxSize: NULL [15:31:53.391] - attr(*, "where")=List of 5 [15:31:53.391] ..$ ...future.FUN : [15:31:53.391] ..$ future.call.arguments : [15:31:53.391] ..$ ...future.elements_ii : [15:31:53.391] ..$ ...future.seeds_ii : [15:31:53.391] ..$ ...future.globals.maxSize: [15:31:53.391] - attr(*, "resolved")= logi FALSE [15:31:53.391] - attr(*, "total_size")= num 4968 [15:31:53.391] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.391] - attr(*, "already-done")= logi TRUE [15:31:53.400] - copied '...future.FUN' to environment [15:31:53.401] - copied 'future.call.arguments' to environment [15:31:53.401] - copied '...future.elements_ii' to environment [15:31:53.401] - copied '...future.seeds_ii' to environment [15:31:53.402] - copied '...future.globals.maxSize' to environment [15:31:53.402] assign_globals() ... done [15:31:53.403] plan(): Setting new future strategy stack: [15:31:53.403] List of future strategies: [15:31:53.403] 1. sequential: [15:31:53.403] - args: function (..., envir = parent.frame(), workers = "") [15:31:53.403] - tweaked: FALSE [15:31:53.403] - call: NULL [15:31:53.404] plan(): nbrOfWorkers() = 1 [15:31:53.406] plan(): Setting new future strategy stack: [15:31:53.406] List of future strategies: [15:31:53.406] 1. sequential: [15:31:53.406] - args: function (..., envir = parent.frame(), workers = "") [15:31:53.406] - tweaked: FALSE [15:31:53.406] - call: plan(strategy) [15:31:53.407] plan(): nbrOfWorkers() = 1 [15:31:53.408] SequentialFuture started (and completed) [15:31:53.408] - Launch lazy future ... done [15:31:53.408] run() for 'SequentialFuture' ... done [15:31:53.409] Created future: [15:31:53.409] SequentialFuture: [15:31:53.409] Label: 'future_lapply-1' [15:31:53.409] Expression: [15:31:53.409] { [15:31:53.409] do.call(function(...) { [15:31:53.409] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.409] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:53.409] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.409] on.exit(options(oopts), add = TRUE) [15:31:53.409] } [15:31:53.409] { [15:31:53.409] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:53.409] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.409] ...future.FUN(...future.X_jj, ...) [15:31:53.409] }) [15:31:53.409] } [15:31:53.409] }, args = future.call.arguments) [15:31:53.409] } [15:31:53.409] Lazy evaluation: FALSE [15:31:53.409] Asynchronous evaluation: FALSE [15:31:53.409] Local evaluation: TRUE [15:31:53.409] Environment: R_GlobalEnv [15:31:53.409] Capture standard output: TRUE [15:31:53.409] Capture condition classes: 'condition' (excluding 'nothing') [15:31:53.409] Globals: 5 objects totaling 17.90 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 13.05 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:53.409] Packages: 1 packages ('listenv') [15:31:53.409] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:53.409] Resolved: TRUE [15:31:53.409] Value: 800 bytes of class 'list' [15:31:53.409] Early signaling: FALSE [15:31:53.409] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:53.409] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:53.412] Chunk #1 of 1 ... DONE [15:31:53.412] Launching 1 futures (chunks) ... DONE [15:31:53.412] Resolving 1 futures (chunks) ... [15:31:53.412] resolve() on list ... [15:31:53.413] recursive: 0 [15:31:53.413] length: 1 [15:31:53.413] [15:31:53.413] resolved() for 'SequentialFuture' ... [15:31:53.414] - state: 'finished' [15:31:53.414] - run: TRUE [15:31:53.414] - result: 'FutureResult' [15:31:53.415] resolved() for 'SequentialFuture' ... done [15:31:53.415] Future #1 [15:31:53.415] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:53.416] - nx: 1 [15:31:53.416] - relay: TRUE [15:31:53.416] - stdout: TRUE [15:31:53.417] - signal: TRUE [15:31:53.417] - resignal: FALSE [15:31:53.417] - force: TRUE [15:31:53.417] - relayed: [n=1] FALSE [15:31:53.418] - queued futures: [n=1] FALSE [15:31:53.418] - until=1 [15:31:53.418] - relaying element #1 [15:31:53.419] - relayed: [n=1] TRUE [15:31:53.419] - queued futures: [n=1] TRUE [15:31:53.419] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:53.420] length: 0 (resolved future 1) [15:31:53.420] Relaying remaining futures [15:31:53.420] signalConditionsASAP(NULL, pos=0) ... [15:31:53.420] - nx: 1 [15:31:53.421] - relay: TRUE [15:31:53.421] - stdout: TRUE [15:31:53.421] - signal: TRUE [15:31:53.421] - resignal: FALSE [15:31:53.422] - force: TRUE [15:31:53.422] - relayed: [n=1] TRUE [15:31:53.422] - queued futures: [n=1] TRUE - flush all [15:31:53.423] - relayed: [n=1] TRUE [15:31:53.423] - queued futures: [n=1] TRUE [15:31:53.423] signalConditionsASAP(NULL, pos=0) ... done [15:31:53.423] resolve() on list ... DONE [15:31:53.424] - Number of value chunks collected: 1 [15:31:53.424] Resolving 1 futures (chunks) ... DONE [15:31:53.424] Reducing values from 1 chunks ... [15:31:53.425] - Number of values collected after concatenation: 2 [15:31:53.425] - Number of values expected: 2 [15:31:53.425] Reverse index remapping (attribute 'ordering'): [n = 2] 2, 1 [15:31:53.426] Reducing values from 1 chunks ... DONE [15:31:53.426] 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, ...) ... [15:31:53.430] future_lapply() ... [15:31:53.431] Number of chunks: 1 [15:31:53.431] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [15:31:53.431] getGlobalsAndPackagesXApply() ... [15:31:53.432] - future.globals: TRUE [15:31:53.432] getGlobalsAndPackages() ... [15:31:53.432] Searching for globals... [15:31:53.434] - globals found: [2] 'FUN', '.Internal' [15:31:53.434] Searching for globals ... DONE [15:31:53.434] Resolving globals: FALSE [15:31:53.435] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:53.435] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:53.435] - globals: [1] 'FUN' [15:31:53.435] [15:31:53.436] getGlobalsAndPackages() ... DONE [15:31:53.436] - globals found/used: [n=1] 'FUN' [15:31:53.436] - needed namespaces: [n=0] [15:31:53.436] Finding globals ... DONE [15:31:53.437] - use_args: TRUE [15:31:53.437] - Getting '...' globals ... [15:31:53.438] resolve() on list ... [15:31:53.438] recursive: 0 [15:31:53.438] length: 1 [15:31:53.438] elements: '...' [15:31:53.439] length: 0 (resolved future 1) [15:31:53.439] resolve() on list ... DONE [15:31:53.439] - '...' content: [n=1] 'length' [15:31:53.440] List of 1 [15:31:53.440] $ ...:List of 1 [15:31:53.440] ..$ length: int 2 [15:31:53.440] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.440] - attr(*, "where")=List of 1 [15:31:53.440] ..$ ...: [15:31:53.440] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.440] - attr(*, "resolved")= logi TRUE [15:31:53.440] - attr(*, "total_size")= num NA [15:31:53.446] - Getting '...' globals ... DONE [15:31:53.447] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:53.447] List of 2 [15:31:53.447] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:53.447] $ ... :List of 1 [15:31:53.447] ..$ length: int 2 [15:31:53.447] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.447] - attr(*, "where")=List of 2 [15:31:53.447] ..$ ...future.FUN: [15:31:53.447] ..$ ... : [15:31:53.447] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.447] - attr(*, "resolved")= logi FALSE [15:31:53.447] - attr(*, "total_size")= num 2240 [15:31:53.453] Packages to be attached in all futures: [n=0] [15:31:53.454] getGlobalsAndPackagesXApply() ... DONE [15:31:53.454] Number of futures (= number of chunks): 1 [15:31:53.455] Launching 1 futures (chunks) ... [15:31:53.455] Chunk #1 of 1 ... [15:31:53.455] - Finding globals in 'X' for chunk #1 ... [15:31:53.455] getGlobalsAndPackages() ... [15:31:53.456] Searching for globals... [15:31:53.456] [15:31:53.457] Searching for globals ... DONE [15:31:53.457] - globals: [0] [15:31:53.457] getGlobalsAndPackages() ... DONE [15:31:53.457] + additional globals found: [n=0] [15:31:53.458] + additional namespaces needed: [n=0] [15:31:53.458] - Finding globals in 'X' for chunk #1 ... DONE [15:31:53.458] - seeds: [15:31:53.459] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.459] getGlobalsAndPackages() ... [15:31:53.459] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.459] Resolving globals: FALSE [15:31:53.460] Tweak future expression to call with '...' arguments ... [15:31:53.460] { [15:31:53.460] do.call(function(...) { [15:31:53.460] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.460] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:53.460] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.460] on.exit(options(oopts), add = TRUE) [15:31:53.460] } [15:31:53.460] { [15:31:53.460] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:53.460] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.460] ...future.FUN(...future.X_jj, ...) [15:31:53.460] }) [15:31:53.460] } [15:31:53.460] }, args = future.call.arguments) [15:31:53.460] } [15:31:53.461] Tweak future expression to call with '...' arguments ... DONE [15:31:53.462] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.462] [15:31:53.462] getGlobalsAndPackages() ... DONE [15:31:53.463] run() for 'Future' ... [15:31:53.463] - state: 'created' [15:31:53.464] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:53.464] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:53.465] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:53.465] - Field: 'label' [15:31:53.465] - Field: 'local' [15:31:53.466] - Field: 'owner' [15:31:53.466] - Field: 'envir' [15:31:53.466] - Field: 'packages' [15:31:53.466] - Field: 'gc' [15:31:53.467] - Field: 'conditions' [15:31:53.467] - Field: 'expr' [15:31:53.467] - Field: 'uuid' [15:31:53.468] - Field: 'seed' [15:31:53.468] - Field: 'version' [15:31:53.468] - Field: 'result' [15:31:53.468] - Field: 'asynchronous' [15:31:53.469] - Field: 'calls' [15:31:53.469] - Field: 'globals' [15:31:53.469] - Field: 'stdout' [15:31:53.470] - Field: 'earlySignal' [15:31:53.470] - Field: 'lazy' [15:31:53.470] - Field: 'state' [15:31:53.470] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:53.471] - Launch lazy future ... [15:31:53.471] Packages needed by the future expression (n = 0): [15:31:53.471] Packages needed by future strategies (n = 0): [15:31:53.472] { [15:31:53.472] { [15:31:53.472] { [15:31:53.472] ...future.startTime <- base::Sys.time() [15:31:53.472] { [15:31:53.472] { [15:31:53.472] { [15:31:53.472] base::local({ [15:31:53.472] has_future <- base::requireNamespace("future", [15:31:53.472] quietly = TRUE) [15:31:53.472] if (has_future) { [15:31:53.472] ns <- base::getNamespace("future") [15:31:53.472] version <- ns[[".package"]][["version"]] [15:31:53.472] if (is.null(version)) [15:31:53.472] version <- utils::packageVersion("future") [15:31:53.472] } [15:31:53.472] else { [15:31:53.472] version <- NULL [15:31:53.472] } [15:31:53.472] if (!has_future || version < "1.8.0") { [15:31:53.472] info <- base::c(r_version = base::gsub("R version ", [15:31:53.472] "", base::R.version$version.string), [15:31:53.472] platform = base::sprintf("%s (%s-bit)", [15:31:53.472] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:53.472] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:53.472] "release", "version")], collapse = " "), [15:31:53.472] hostname = base::Sys.info()[["nodename"]]) [15:31:53.472] info <- base::sprintf("%s: %s", base::names(info), [15:31:53.472] info) [15:31:53.472] info <- base::paste(info, collapse = "; ") [15:31:53.472] if (!has_future) { [15:31:53.472] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:53.472] info) [15:31:53.472] } [15:31:53.472] else { [15:31:53.472] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:53.472] info, version) [15:31:53.472] } [15:31:53.472] base::stop(msg) [15:31:53.472] } [15:31:53.472] }) [15:31:53.472] } [15:31:53.472] ...future.strategy.old <- future::plan("list") [15:31:53.472] options(future.plan = NULL) [15:31:53.472] Sys.unsetenv("R_FUTURE_PLAN") [15:31:53.472] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:53.472] } [15:31:53.472] ...future.workdir <- getwd() [15:31:53.472] } [15:31:53.472] ...future.oldOptions <- base::as.list(base::.Options) [15:31:53.472] ...future.oldEnvVars <- base::Sys.getenv() [15:31:53.472] } [15:31:53.472] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:53.472] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:53.472] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:53.472] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:53.472] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:53.472] future.stdout.windows.reencode = NULL, width = 80L) [15:31:53.472] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:53.472] base::names(...future.oldOptions)) [15:31:53.472] } [15:31:53.472] if (FALSE) { [15:31:53.472] } [15:31:53.472] else { [15:31:53.472] if (TRUE) { [15:31:53.472] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:53.472] open = "w") [15:31:53.472] } [15:31:53.472] else { [15:31:53.472] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:53.472] windows = "NUL", "/dev/null"), open = "w") [15:31:53.472] } [15:31:53.472] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:53.472] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:53.472] base::sink(type = "output", split = FALSE) [15:31:53.472] base::close(...future.stdout) [15:31:53.472] }, add = TRUE) [15:31:53.472] } [15:31:53.472] ...future.frame <- base::sys.nframe() [15:31:53.472] ...future.conditions <- base::list() [15:31:53.472] ...future.rng <- base::globalenv()$.Random.seed [15:31:53.472] if (FALSE) { [15:31:53.472] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:53.472] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:53.472] } [15:31:53.472] ...future.result <- base::tryCatch({ [15:31:53.472] base::withCallingHandlers({ [15:31:53.472] ...future.value <- base::withVisible(base::local({ [15:31:53.472] do.call(function(...) { [15:31:53.472] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.472] if (!identical(...future.globals.maxSize.org, [15:31:53.472] ...future.globals.maxSize)) { [15:31:53.472] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.472] on.exit(options(oopts), add = TRUE) [15:31:53.472] } [15:31:53.472] { [15:31:53.472] lapply(seq_along(...future.elements_ii), [15:31:53.472] FUN = function(jj) { [15:31:53.472] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.472] ...future.FUN(...future.X_jj, ...) [15:31:53.472] }) [15:31:53.472] } [15:31:53.472] }, args = future.call.arguments) [15:31:53.472] })) [15:31:53.472] future::FutureResult(value = ...future.value$value, [15:31:53.472] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:53.472] ...future.rng), globalenv = if (FALSE) [15:31:53.472] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:53.472] ...future.globalenv.names)) [15:31:53.472] else NULL, started = ...future.startTime, version = "1.8") [15:31:53.472] }, condition = base::local({ [15:31:53.472] c <- base::c [15:31:53.472] inherits <- base::inherits [15:31:53.472] invokeRestart <- base::invokeRestart [15:31:53.472] length <- base::length [15:31:53.472] list <- base::list [15:31:53.472] seq.int <- base::seq.int [15:31:53.472] signalCondition <- base::signalCondition [15:31:53.472] sys.calls <- base::sys.calls [15:31:53.472] `[[` <- base::`[[` [15:31:53.472] `+` <- base::`+` [15:31:53.472] `<<-` <- base::`<<-` [15:31:53.472] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:53.472] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:53.472] 3L)] [15:31:53.472] } [15:31:53.472] function(cond) { [15:31:53.472] is_error <- inherits(cond, "error") [15:31:53.472] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:53.472] NULL) [15:31:53.472] if (is_error) { [15:31:53.472] sessionInformation <- function() { [15:31:53.472] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:53.472] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:53.472] search = base::search(), system = base::Sys.info()) [15:31:53.472] } [15:31:53.472] ...future.conditions[[length(...future.conditions) + [15:31:53.472] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:53.472] cond$call), session = sessionInformation(), [15:31:53.472] timestamp = base::Sys.time(), signaled = 0L) [15:31:53.472] signalCondition(cond) [15:31:53.472] } [15:31:53.472] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:53.472] "immediateCondition"))) { [15:31:53.472] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:53.472] ...future.conditions[[length(...future.conditions) + [15:31:53.472] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:53.472] if (TRUE && !signal) { [15:31:53.472] muffleCondition <- function (cond, pattern = "^muffle") [15:31:53.472] { [15:31:53.472] inherits <- base::inherits [15:31:53.472] invokeRestart <- base::invokeRestart [15:31:53.472] is.null <- base::is.null [15:31:53.472] muffled <- FALSE [15:31:53.472] if (inherits(cond, "message")) { [15:31:53.472] muffled <- grepl(pattern, "muffleMessage") [15:31:53.472] if (muffled) [15:31:53.472] invokeRestart("muffleMessage") [15:31:53.472] } [15:31:53.472] else if (inherits(cond, "warning")) { [15:31:53.472] muffled <- grepl(pattern, "muffleWarning") [15:31:53.472] if (muffled) [15:31:53.472] invokeRestart("muffleWarning") [15:31:53.472] } [15:31:53.472] else if (inherits(cond, "condition")) { [15:31:53.472] if (!is.null(pattern)) { [15:31:53.472] computeRestarts <- base::computeRestarts [15:31:53.472] grepl <- base::grepl [15:31:53.472] restarts <- computeRestarts(cond) [15:31:53.472] for (restart in restarts) { [15:31:53.472] name <- restart$name [15:31:53.472] if (is.null(name)) [15:31:53.472] next [15:31:53.472] if (!grepl(pattern, name)) [15:31:53.472] next [15:31:53.472] invokeRestart(restart) [15:31:53.472] muffled <- TRUE [15:31:53.472] break [15:31:53.472] } [15:31:53.472] } [15:31:53.472] } [15:31:53.472] invisible(muffled) [15:31:53.472] } [15:31:53.472] muffleCondition(cond, pattern = "^muffle") [15:31:53.472] } [15:31:53.472] } [15:31:53.472] else { [15:31:53.472] if (TRUE) { [15:31:53.472] muffleCondition <- function (cond, pattern = "^muffle") [15:31:53.472] { [15:31:53.472] inherits <- base::inherits [15:31:53.472] invokeRestart <- base::invokeRestart [15:31:53.472] is.null <- base::is.null [15:31:53.472] muffled <- FALSE [15:31:53.472] if (inherits(cond, "message")) { [15:31:53.472] muffled <- grepl(pattern, "muffleMessage") [15:31:53.472] if (muffled) [15:31:53.472] invokeRestart("muffleMessage") [15:31:53.472] } [15:31:53.472] else if (inherits(cond, "warning")) { [15:31:53.472] muffled <- grepl(pattern, "muffleWarning") [15:31:53.472] if (muffled) [15:31:53.472] invokeRestart("muffleWarning") [15:31:53.472] } [15:31:53.472] else if (inherits(cond, "condition")) { [15:31:53.472] if (!is.null(pattern)) { [15:31:53.472] computeRestarts <- base::computeRestarts [15:31:53.472] grepl <- base::grepl [15:31:53.472] restarts <- computeRestarts(cond) [15:31:53.472] for (restart in restarts) { [15:31:53.472] name <- restart$name [15:31:53.472] if (is.null(name)) [15:31:53.472] next [15:31:53.472] if (!grepl(pattern, name)) [15:31:53.472] next [15:31:53.472] invokeRestart(restart) [15:31:53.472] muffled <- TRUE [15:31:53.472] break [15:31:53.472] } [15:31:53.472] } [15:31:53.472] } [15:31:53.472] invisible(muffled) [15:31:53.472] } [15:31:53.472] muffleCondition(cond, pattern = "^muffle") [15:31:53.472] } [15:31:53.472] } [15:31:53.472] } [15:31:53.472] })) [15:31:53.472] }, error = function(ex) { [15:31:53.472] base::structure(base::list(value = NULL, visible = NULL, [15:31:53.472] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:53.472] ...future.rng), started = ...future.startTime, [15:31:53.472] finished = Sys.time(), session_uuid = NA_character_, [15:31:53.472] version = "1.8"), class = "FutureResult") [15:31:53.472] }, finally = { [15:31:53.472] if (!identical(...future.workdir, getwd())) [15:31:53.472] setwd(...future.workdir) [15:31:53.472] { [15:31:53.472] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:53.472] ...future.oldOptions$nwarnings <- NULL [15:31:53.472] } [15:31:53.472] base::options(...future.oldOptions) [15:31:53.472] if (.Platform$OS.type == "windows") { [15:31:53.472] old_names <- names(...future.oldEnvVars) [15:31:53.472] envs <- base::Sys.getenv() [15:31:53.472] names <- names(envs) [15:31:53.472] common <- intersect(names, old_names) [15:31:53.472] added <- setdiff(names, old_names) [15:31:53.472] removed <- setdiff(old_names, names) [15:31:53.472] changed <- common[...future.oldEnvVars[common] != [15:31:53.472] envs[common]] [15:31:53.472] NAMES <- toupper(changed) [15:31:53.472] args <- list() [15:31:53.472] for (kk in seq_along(NAMES)) { [15:31:53.472] name <- changed[[kk]] [15:31:53.472] NAME <- NAMES[[kk]] [15:31:53.472] if (name != NAME && is.element(NAME, old_names)) [15:31:53.472] next [15:31:53.472] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:53.472] } [15:31:53.472] NAMES <- toupper(added) [15:31:53.472] for (kk in seq_along(NAMES)) { [15:31:53.472] name <- added[[kk]] [15:31:53.472] NAME <- NAMES[[kk]] [15:31:53.472] if (name != NAME && is.element(NAME, old_names)) [15:31:53.472] next [15:31:53.472] args[[name]] <- "" [15:31:53.472] } [15:31:53.472] NAMES <- toupper(removed) [15:31:53.472] for (kk in seq_along(NAMES)) { [15:31:53.472] name <- removed[[kk]] [15:31:53.472] NAME <- NAMES[[kk]] [15:31:53.472] if (name != NAME && is.element(NAME, old_names)) [15:31:53.472] next [15:31:53.472] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:53.472] } [15:31:53.472] if (length(args) > 0) [15:31:53.472] base::do.call(base::Sys.setenv, args = args) [15:31:53.472] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:53.472] } [15:31:53.472] else { [15:31:53.472] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:53.472] } [15:31:53.472] { [15:31:53.472] if (base::length(...future.futureOptionsAdded) > [15:31:53.472] 0L) { [15:31:53.472] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:53.472] base::names(opts) <- ...future.futureOptionsAdded [15:31:53.472] base::options(opts) [15:31:53.472] } [15:31:53.472] { [15:31:53.472] { [15:31:53.472] NULL [15:31:53.472] RNGkind("Mersenne-Twister") [15:31:53.472] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:53.472] inherits = FALSE) [15:31:53.472] } [15:31:53.472] options(future.plan = NULL) [15:31:53.472] if (is.na(NA_character_)) [15:31:53.472] Sys.unsetenv("R_FUTURE_PLAN") [15:31:53.472] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:53.472] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:53.472] .init = FALSE) [15:31:53.472] } [15:31:53.472] } [15:31:53.472] } [15:31:53.472] }) [15:31:53.472] if (TRUE) { [15:31:53.472] base::sink(type = "output", split = FALSE) [15:31:53.472] if (TRUE) { [15:31:53.472] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:53.472] } [15:31:53.472] else { [15:31:53.472] ...future.result["stdout"] <- base::list(NULL) [15:31:53.472] } [15:31:53.472] base::close(...future.stdout) [15:31:53.472] ...future.stdout <- NULL [15:31:53.472] } [15:31:53.472] ...future.result$conditions <- ...future.conditions [15:31:53.472] ...future.result$finished <- base::Sys.time() [15:31:53.472] ...future.result [15:31:53.472] } [15:31:53.479] assign_globals() ... [15:31:53.479] List of 5 [15:31:53.479] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:53.479] $ future.call.arguments :List of 1 [15:31:53.479] ..$ length: int 2 [15:31:53.479] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.479] $ ...future.elements_ii :List of 4 [15:31:53.479] ..$ c: chr "list" [15:31:53.479] ..$ c: chr "character" [15:31:53.479] ..$ b: chr "numeric" [15:31:53.479] ..$ a: chr "integer" [15:31:53.479] $ ...future.seeds_ii : NULL [15:31:53.479] $ ...future.globals.maxSize: NULL [15:31:53.479] - attr(*, "where")=List of 5 [15:31:53.479] ..$ ...future.FUN : [15:31:53.479] ..$ future.call.arguments : [15:31:53.479] ..$ ...future.elements_ii : [15:31:53.479] ..$ ...future.seeds_ii : [15:31:53.479] ..$ ...future.globals.maxSize: [15:31:53.479] - attr(*, "resolved")= logi FALSE [15:31:53.479] - attr(*, "total_size")= num 2240 [15:31:53.479] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.479] - attr(*, "already-done")= logi TRUE [15:31:53.488] - copied '...future.FUN' to environment [15:31:53.488] - copied 'future.call.arguments' to environment [15:31:53.488] - copied '...future.elements_ii' to environment [15:31:53.488] - copied '...future.seeds_ii' to environment [15:31:53.488] - copied '...future.globals.maxSize' to environment [15:31:53.489] assign_globals() ... done [15:31:53.489] plan(): Setting new future strategy stack: [15:31:53.489] List of future strategies: [15:31:53.489] 1. sequential: [15:31:53.489] - args: function (..., envir = parent.frame(), workers = "") [15:31:53.489] - tweaked: FALSE [15:31:53.489] - call: NULL [15:31:53.490] plan(): nbrOfWorkers() = 1 [15:31:53.491] plan(): Setting new future strategy stack: [15:31:53.492] List of future strategies: [15:31:53.492] 1. sequential: [15:31:53.492] - args: function (..., envir = parent.frame(), workers = "") [15:31:53.492] - tweaked: FALSE [15:31:53.492] - call: plan(strategy) [15:31:53.492] plan(): nbrOfWorkers() = 1 [15:31:53.493] SequentialFuture started (and completed) [15:31:53.493] - Launch lazy future ... done [15:31:53.493] run() for 'SequentialFuture' ... done [15:31:53.493] Created future: [15:31:53.493] SequentialFuture: [15:31:53.493] Label: 'future_lapply-1' [15:31:53.493] Expression: [15:31:53.493] { [15:31:53.493] do.call(function(...) { [15:31:53.493] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.493] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:53.493] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.493] on.exit(options(oopts), add = TRUE) [15:31:53.493] } [15:31:53.493] { [15:31:53.493] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:53.493] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.493] ...future.FUN(...future.X_jj, ...) [15:31:53.493] }) [15:31:53.493] } [15:31:53.493] }, args = future.call.arguments) [15:31:53.493] } [15:31:53.493] Lazy evaluation: FALSE [15:31:53.493] Asynchronous evaluation: FALSE [15:31:53.493] Local evaluation: TRUE [15:31:53.493] Environment: R_GlobalEnv [15:31:53.493] Capture standard output: TRUE [15:31:53.493] Capture condition classes: 'condition' (excluding 'nothing') [15:31:53.493] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:53.493] Packages: [15:31:53.493] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:53.493] Resolved: TRUE [15:31:53.493] Value: 240 bytes of class 'list' [15:31:53.493] Early signaling: FALSE [15:31:53.493] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:53.493] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:53.495] Chunk #1 of 1 ... DONE [15:31:53.495] Launching 1 futures (chunks) ... DONE [15:31:53.495] Resolving 1 futures (chunks) ... [15:31:53.495] resolve() on list ... [15:31:53.496] recursive: 0 [15:31:53.496] length: 1 [15:31:53.496] [15:31:53.496] resolved() for 'SequentialFuture' ... [15:31:53.496] - state: 'finished' [15:31:53.496] - run: TRUE [15:31:53.497] - result: 'FutureResult' [15:31:53.497] resolved() for 'SequentialFuture' ... done [15:31:53.497] Future #1 [15:31:53.497] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:53.497] - nx: 1 [15:31:53.498] - relay: TRUE [15:31:53.498] - stdout: TRUE [15:31:53.498] - signal: TRUE [15:31:53.498] - resignal: FALSE [15:31:53.498] - force: TRUE [15:31:53.498] - relayed: [n=1] FALSE [15:31:53.499] - queued futures: [n=1] FALSE [15:31:53.499] - until=1 [15:31:53.499] - relaying element #1 [15:31:53.500] - relayed: [n=1] TRUE [15:31:53.500] - queued futures: [n=1] TRUE [15:31:53.500] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:53.501] length: 0 (resolved future 1) [15:31:53.501] Relaying remaining futures [15:31:53.501] signalConditionsASAP(NULL, pos=0) ... [15:31:53.502] - nx: 1 [15:31:53.502] - relay: TRUE [15:31:53.502] - stdout: TRUE [15:31:53.503] - signal: TRUE [15:31:53.503] - resignal: FALSE [15:31:53.503] - force: TRUE [15:31:53.504] - relayed: [n=1] TRUE [15:31:53.504] - queued futures: [n=1] TRUE - flush all [15:31:53.504] - relayed: [n=1] TRUE [15:31:53.505] - queued futures: [n=1] TRUE [15:31:53.505] signalConditionsASAP(NULL, pos=0) ... done [15:31:53.505] resolve() on list ... DONE [15:31:53.506] - Number of value chunks collected: 1 [15:31:53.506] Resolving 1 futures (chunks) ... DONE [15:31:53.507] Reducing values from 1 chunks ... [15:31:53.507] - Number of values collected after concatenation: 4 [15:31:53.507] - Number of values expected: 4 [15:31:53.508] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [15:31:53.508] Reducing values from 1 chunks ... DONE [15:31:53.508] 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 [15:31:53.513] future_lapply() ... [15:31:53.515] Number of chunks: 1 [15:31:53.516] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [15:31:53.516] getGlobalsAndPackagesXApply() ... [15:31:53.516] - future.globals: TRUE [15:31:53.517] getGlobalsAndPackages() ... [15:31:53.517] Searching for globals... [15:31:53.520] - globals found: [2] 'FUN', '.Internal' [15:31:53.520] Searching for globals ... DONE [15:31:53.520] Resolving globals: FALSE [15:31:53.521] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:53.522] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:53.523] - globals: [1] 'FUN' [15:31:53.523] [15:31:53.523] getGlobalsAndPackages() ... DONE [15:31:53.523] - globals found/used: [n=1] 'FUN' [15:31:53.524] - needed namespaces: [n=0] [15:31:53.524] Finding globals ... DONE [15:31:53.525] - use_args: TRUE [15:31:53.525] - Getting '...' globals ... [15:31:53.526] resolve() on list ... [15:31:53.526] recursive: 0 [15:31:53.526] length: 1 [15:31:53.527] elements: '...' [15:31:53.527] length: 0 (resolved future 1) [15:31:53.527] resolve() on list ... DONE [15:31:53.528] - '...' content: [n=1] 'length' [15:31:53.528] List of 1 [15:31:53.528] $ ...:List of 1 [15:31:53.528] ..$ length: int 2 [15:31:53.528] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.528] - attr(*, "where")=List of 1 [15:31:53.528] ..$ ...: [15:31:53.528] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.528] - attr(*, "resolved")= logi TRUE [15:31:53.528] - attr(*, "total_size")= num NA [15:31:53.535] - Getting '...' globals ... DONE [15:31:53.535] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:53.535] List of 2 [15:31:53.535] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:53.535] $ ... :List of 1 [15:31:53.535] ..$ length: int 2 [15:31:53.535] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.535] - attr(*, "where")=List of 2 [15:31:53.535] ..$ ...future.FUN: [15:31:53.535] ..$ ... : [15:31:53.535] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.535] - attr(*, "resolved")= logi FALSE [15:31:53.535] - attr(*, "total_size")= num 2240 [15:31:53.543] Packages to be attached in all futures: [n=0] [15:31:53.544] getGlobalsAndPackagesXApply() ... DONE [15:31:53.544] Number of futures (= number of chunks): 1 [15:31:53.544] Launching 1 futures (chunks) ... [15:31:53.545] Chunk #1 of 1 ... [15:31:53.545] - Finding globals in 'X' for chunk #1 ... [15:31:53.545] getGlobalsAndPackages() ... [15:31:53.545] Searching for globals... [15:31:53.546] [15:31:53.546] Searching for globals ... DONE [15:31:53.546] - globals: [0] [15:31:53.547] getGlobalsAndPackages() ... DONE [15:31:53.547] + additional globals found: [n=0] [15:31:53.547] + additional namespaces needed: [n=0] [15:31:53.547] - Finding globals in 'X' for chunk #1 ... DONE [15:31:53.547] - seeds: [15:31:53.548] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.548] getGlobalsAndPackages() ... [15:31:53.548] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.548] Resolving globals: FALSE [15:31:53.548] Tweak future expression to call with '...' arguments ... [15:31:53.549] { [15:31:53.549] do.call(function(...) { [15:31:53.549] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.549] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:53.549] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.549] on.exit(options(oopts), add = TRUE) [15:31:53.549] } [15:31:53.549] { [15:31:53.549] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:53.549] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.549] ...future.FUN(...future.X_jj, ...) [15:31:53.549] }) [15:31:53.549] } [15:31:53.549] }, args = future.call.arguments) [15:31:53.549] } [15:31:53.549] Tweak future expression to call with '...' arguments ... DONE [15:31:53.550] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.550] [15:31:53.551] getGlobalsAndPackages() ... DONE [15:31:53.551] run() for 'Future' ... [15:31:53.551] - state: 'created' [15:31:53.552] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:53.552] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:53.552] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:53.553] - Field: 'label' [15:31:53.553] - Field: 'local' [15:31:53.553] - Field: 'owner' [15:31:53.553] - Field: 'envir' [15:31:53.553] - Field: 'packages' [15:31:53.554] - Field: 'gc' [15:31:53.554] - Field: 'conditions' [15:31:53.554] - Field: 'expr' [15:31:53.554] - Field: 'uuid' [15:31:53.555] - Field: 'seed' [15:31:53.555] - Field: 'version' [15:31:53.555] - Field: 'result' [15:31:53.555] - Field: 'asynchronous' [15:31:53.555] - Field: 'calls' [15:31:53.556] - Field: 'globals' [15:31:53.556] - Field: 'stdout' [15:31:53.556] - Field: 'earlySignal' [15:31:53.556] - Field: 'lazy' [15:31:53.556] - Field: 'state' [15:31:53.557] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:53.557] - Launch lazy future ... [15:31:53.557] Packages needed by the future expression (n = 0): [15:31:53.558] Packages needed by future strategies (n = 0): [15:31:53.558] { [15:31:53.558] { [15:31:53.558] { [15:31:53.558] ...future.startTime <- base::Sys.time() [15:31:53.558] { [15:31:53.558] { [15:31:53.558] { [15:31:53.558] base::local({ [15:31:53.558] has_future <- base::requireNamespace("future", [15:31:53.558] quietly = TRUE) [15:31:53.558] if (has_future) { [15:31:53.558] ns <- base::getNamespace("future") [15:31:53.558] version <- ns[[".package"]][["version"]] [15:31:53.558] if (is.null(version)) [15:31:53.558] version <- utils::packageVersion("future") [15:31:53.558] } [15:31:53.558] else { [15:31:53.558] version <- NULL [15:31:53.558] } [15:31:53.558] if (!has_future || version < "1.8.0") { [15:31:53.558] info <- base::c(r_version = base::gsub("R version ", [15:31:53.558] "", base::R.version$version.string), [15:31:53.558] platform = base::sprintf("%s (%s-bit)", [15:31:53.558] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:53.558] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:53.558] "release", "version")], collapse = " "), [15:31:53.558] hostname = base::Sys.info()[["nodename"]]) [15:31:53.558] info <- base::sprintf("%s: %s", base::names(info), [15:31:53.558] info) [15:31:53.558] info <- base::paste(info, collapse = "; ") [15:31:53.558] if (!has_future) { [15:31:53.558] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:53.558] info) [15:31:53.558] } [15:31:53.558] else { [15:31:53.558] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:53.558] info, version) [15:31:53.558] } [15:31:53.558] base::stop(msg) [15:31:53.558] } [15:31:53.558] }) [15:31:53.558] } [15:31:53.558] ...future.strategy.old <- future::plan("list") [15:31:53.558] options(future.plan = NULL) [15:31:53.558] Sys.unsetenv("R_FUTURE_PLAN") [15:31:53.558] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:53.558] } [15:31:53.558] ...future.workdir <- getwd() [15:31:53.558] } [15:31:53.558] ...future.oldOptions <- base::as.list(base::.Options) [15:31:53.558] ...future.oldEnvVars <- base::Sys.getenv() [15:31:53.558] } [15:31:53.558] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:53.558] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:53.558] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:53.558] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:53.558] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:53.558] future.stdout.windows.reencode = NULL, width = 80L) [15:31:53.558] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:53.558] base::names(...future.oldOptions)) [15:31:53.558] } [15:31:53.558] if (FALSE) { [15:31:53.558] } [15:31:53.558] else { [15:31:53.558] if (TRUE) { [15:31:53.558] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:53.558] open = "w") [15:31:53.558] } [15:31:53.558] else { [15:31:53.558] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:53.558] windows = "NUL", "/dev/null"), open = "w") [15:31:53.558] } [15:31:53.558] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:53.558] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:53.558] base::sink(type = "output", split = FALSE) [15:31:53.558] base::close(...future.stdout) [15:31:53.558] }, add = TRUE) [15:31:53.558] } [15:31:53.558] ...future.frame <- base::sys.nframe() [15:31:53.558] ...future.conditions <- base::list() [15:31:53.558] ...future.rng <- base::globalenv()$.Random.seed [15:31:53.558] if (FALSE) { [15:31:53.558] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:53.558] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:53.558] } [15:31:53.558] ...future.result <- base::tryCatch({ [15:31:53.558] base::withCallingHandlers({ [15:31:53.558] ...future.value <- base::withVisible(base::local({ [15:31:53.558] do.call(function(...) { [15:31:53.558] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.558] if (!identical(...future.globals.maxSize.org, [15:31:53.558] ...future.globals.maxSize)) { [15:31:53.558] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.558] on.exit(options(oopts), add = TRUE) [15:31:53.558] } [15:31:53.558] { [15:31:53.558] lapply(seq_along(...future.elements_ii), [15:31:53.558] FUN = function(jj) { [15:31:53.558] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.558] ...future.FUN(...future.X_jj, ...) [15:31:53.558] }) [15:31:53.558] } [15:31:53.558] }, args = future.call.arguments) [15:31:53.558] })) [15:31:53.558] future::FutureResult(value = ...future.value$value, [15:31:53.558] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:53.558] ...future.rng), globalenv = if (FALSE) [15:31:53.558] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:53.558] ...future.globalenv.names)) [15:31:53.558] else NULL, started = ...future.startTime, version = "1.8") [15:31:53.558] }, condition = base::local({ [15:31:53.558] c <- base::c [15:31:53.558] inherits <- base::inherits [15:31:53.558] invokeRestart <- base::invokeRestart [15:31:53.558] length <- base::length [15:31:53.558] list <- base::list [15:31:53.558] seq.int <- base::seq.int [15:31:53.558] signalCondition <- base::signalCondition [15:31:53.558] sys.calls <- base::sys.calls [15:31:53.558] `[[` <- base::`[[` [15:31:53.558] `+` <- base::`+` [15:31:53.558] `<<-` <- base::`<<-` [15:31:53.558] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:53.558] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:53.558] 3L)] [15:31:53.558] } [15:31:53.558] function(cond) { [15:31:53.558] is_error <- inherits(cond, "error") [15:31:53.558] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:53.558] NULL) [15:31:53.558] if (is_error) { [15:31:53.558] sessionInformation <- function() { [15:31:53.558] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:53.558] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:53.558] search = base::search(), system = base::Sys.info()) [15:31:53.558] } [15:31:53.558] ...future.conditions[[length(...future.conditions) + [15:31:53.558] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:53.558] cond$call), session = sessionInformation(), [15:31:53.558] timestamp = base::Sys.time(), signaled = 0L) [15:31:53.558] signalCondition(cond) [15:31:53.558] } [15:31:53.558] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:53.558] "immediateCondition"))) { [15:31:53.558] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:53.558] ...future.conditions[[length(...future.conditions) + [15:31:53.558] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:53.558] if (TRUE && !signal) { [15:31:53.558] muffleCondition <- function (cond, pattern = "^muffle") [15:31:53.558] { [15:31:53.558] inherits <- base::inherits [15:31:53.558] invokeRestart <- base::invokeRestart [15:31:53.558] is.null <- base::is.null [15:31:53.558] muffled <- FALSE [15:31:53.558] if (inherits(cond, "message")) { [15:31:53.558] muffled <- grepl(pattern, "muffleMessage") [15:31:53.558] if (muffled) [15:31:53.558] invokeRestart("muffleMessage") [15:31:53.558] } [15:31:53.558] else if (inherits(cond, "warning")) { [15:31:53.558] muffled <- grepl(pattern, "muffleWarning") [15:31:53.558] if (muffled) [15:31:53.558] invokeRestart("muffleWarning") [15:31:53.558] } [15:31:53.558] else if (inherits(cond, "condition")) { [15:31:53.558] if (!is.null(pattern)) { [15:31:53.558] computeRestarts <- base::computeRestarts [15:31:53.558] grepl <- base::grepl [15:31:53.558] restarts <- computeRestarts(cond) [15:31:53.558] for (restart in restarts) { [15:31:53.558] name <- restart$name [15:31:53.558] if (is.null(name)) [15:31:53.558] next [15:31:53.558] if (!grepl(pattern, name)) [15:31:53.558] next [15:31:53.558] invokeRestart(restart) [15:31:53.558] muffled <- TRUE [15:31:53.558] break [15:31:53.558] } [15:31:53.558] } [15:31:53.558] } [15:31:53.558] invisible(muffled) [15:31:53.558] } [15:31:53.558] muffleCondition(cond, pattern = "^muffle") [15:31:53.558] } [15:31:53.558] } [15:31:53.558] else { [15:31:53.558] if (TRUE) { [15:31:53.558] muffleCondition <- function (cond, pattern = "^muffle") [15:31:53.558] { [15:31:53.558] inherits <- base::inherits [15:31:53.558] invokeRestart <- base::invokeRestart [15:31:53.558] is.null <- base::is.null [15:31:53.558] muffled <- FALSE [15:31:53.558] if (inherits(cond, "message")) { [15:31:53.558] muffled <- grepl(pattern, "muffleMessage") [15:31:53.558] if (muffled) [15:31:53.558] invokeRestart("muffleMessage") [15:31:53.558] } [15:31:53.558] else if (inherits(cond, "warning")) { [15:31:53.558] muffled <- grepl(pattern, "muffleWarning") [15:31:53.558] if (muffled) [15:31:53.558] invokeRestart("muffleWarning") [15:31:53.558] } [15:31:53.558] else if (inherits(cond, "condition")) { [15:31:53.558] if (!is.null(pattern)) { [15:31:53.558] computeRestarts <- base::computeRestarts [15:31:53.558] grepl <- base::grepl [15:31:53.558] restarts <- computeRestarts(cond) [15:31:53.558] for (restart in restarts) { [15:31:53.558] name <- restart$name [15:31:53.558] if (is.null(name)) [15:31:53.558] next [15:31:53.558] if (!grepl(pattern, name)) [15:31:53.558] next [15:31:53.558] invokeRestart(restart) [15:31:53.558] muffled <- TRUE [15:31:53.558] break [15:31:53.558] } [15:31:53.558] } [15:31:53.558] } [15:31:53.558] invisible(muffled) [15:31:53.558] } [15:31:53.558] muffleCondition(cond, pattern = "^muffle") [15:31:53.558] } [15:31:53.558] } [15:31:53.558] } [15:31:53.558] })) [15:31:53.558] }, error = function(ex) { [15:31:53.558] base::structure(base::list(value = NULL, visible = NULL, [15:31:53.558] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:53.558] ...future.rng), started = ...future.startTime, [15:31:53.558] finished = Sys.time(), session_uuid = NA_character_, [15:31:53.558] version = "1.8"), class = "FutureResult") [15:31:53.558] }, finally = { [15:31:53.558] if (!identical(...future.workdir, getwd())) [15:31:53.558] setwd(...future.workdir) [15:31:53.558] { [15:31:53.558] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:53.558] ...future.oldOptions$nwarnings <- NULL [15:31:53.558] } [15:31:53.558] base::options(...future.oldOptions) [15:31:53.558] if (.Platform$OS.type == "windows") { [15:31:53.558] old_names <- names(...future.oldEnvVars) [15:31:53.558] envs <- base::Sys.getenv() [15:31:53.558] names <- names(envs) [15:31:53.558] common <- intersect(names, old_names) [15:31:53.558] added <- setdiff(names, old_names) [15:31:53.558] removed <- setdiff(old_names, names) [15:31:53.558] changed <- common[...future.oldEnvVars[common] != [15:31:53.558] envs[common]] [15:31:53.558] NAMES <- toupper(changed) [15:31:53.558] args <- list() [15:31:53.558] for (kk in seq_along(NAMES)) { [15:31:53.558] name <- changed[[kk]] [15:31:53.558] NAME <- NAMES[[kk]] [15:31:53.558] if (name != NAME && is.element(NAME, old_names)) [15:31:53.558] next [15:31:53.558] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:53.558] } [15:31:53.558] NAMES <- toupper(added) [15:31:53.558] for (kk in seq_along(NAMES)) { [15:31:53.558] name <- added[[kk]] [15:31:53.558] NAME <- NAMES[[kk]] [15:31:53.558] if (name != NAME && is.element(NAME, old_names)) [15:31:53.558] next [15:31:53.558] args[[name]] <- "" [15:31:53.558] } [15:31:53.558] NAMES <- toupper(removed) [15:31:53.558] for (kk in seq_along(NAMES)) { [15:31:53.558] name <- removed[[kk]] [15:31:53.558] NAME <- NAMES[[kk]] [15:31:53.558] if (name != NAME && is.element(NAME, old_names)) [15:31:53.558] next [15:31:53.558] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:53.558] } [15:31:53.558] if (length(args) > 0) [15:31:53.558] base::do.call(base::Sys.setenv, args = args) [15:31:53.558] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:53.558] } [15:31:53.558] else { [15:31:53.558] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:53.558] } [15:31:53.558] { [15:31:53.558] if (base::length(...future.futureOptionsAdded) > [15:31:53.558] 0L) { [15:31:53.558] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:53.558] base::names(opts) <- ...future.futureOptionsAdded [15:31:53.558] base::options(opts) [15:31:53.558] } [15:31:53.558] { [15:31:53.558] { [15:31:53.558] NULL [15:31:53.558] RNGkind("Mersenne-Twister") [15:31:53.558] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:53.558] inherits = FALSE) [15:31:53.558] } [15:31:53.558] options(future.plan = NULL) [15:31:53.558] if (is.na(NA_character_)) [15:31:53.558] Sys.unsetenv("R_FUTURE_PLAN") [15:31:53.558] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:53.558] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:53.558] .init = FALSE) [15:31:53.558] } [15:31:53.558] } [15:31:53.558] } [15:31:53.558] }) [15:31:53.558] if (TRUE) { [15:31:53.558] base::sink(type = "output", split = FALSE) [15:31:53.558] if (TRUE) { [15:31:53.558] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:53.558] } [15:31:53.558] else { [15:31:53.558] ...future.result["stdout"] <- base::list(NULL) [15:31:53.558] } [15:31:53.558] base::close(...future.stdout) [15:31:53.558] ...future.stdout <- NULL [15:31:53.558] } [15:31:53.558] ...future.result$conditions <- ...future.conditions [15:31:53.558] ...future.result$finished <- base::Sys.time() [15:31:53.558] ...future.result [15:31:53.558] } [15:31:53.564] assign_globals() ... [15:31:53.565] List of 5 [15:31:53.565] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:53.565] $ future.call.arguments :List of 1 [15:31:53.565] ..$ length: int 2 [15:31:53.565] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.565] $ ...future.elements_ii :List of 4 [15:31:53.565] ..$ c: chr "list" [15:31:53.565] ..$ c: chr "character" [15:31:53.565] ..$ b: chr "numeric" [15:31:53.565] ..$ a: chr "integer" [15:31:53.565] $ ...future.seeds_ii : NULL [15:31:53.565] $ ...future.globals.maxSize: NULL [15:31:53.565] - attr(*, "where")=List of 5 [15:31:53.565] ..$ ...future.FUN : [15:31:53.565] ..$ future.call.arguments : [15:31:53.565] ..$ ...future.elements_ii : [15:31:53.565] ..$ ...future.seeds_ii : [15:31:53.565] ..$ ...future.globals.maxSize: [15:31:53.565] - attr(*, "resolved")= logi FALSE [15:31:53.565] - attr(*, "total_size")= num 2240 [15:31:53.565] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.565] - attr(*, "already-done")= logi TRUE [15:31:53.576] - copied '...future.FUN' to environment [15:31:53.576] - copied 'future.call.arguments' to environment [15:31:53.576] - copied '...future.elements_ii' to environment [15:31:53.577] - copied '...future.seeds_ii' to environment [15:31:53.577] - copied '...future.globals.maxSize' to environment [15:31:53.577] assign_globals() ... done [15:31:53.578] plan(): Setting new future strategy stack: [15:31:53.578] List of future strategies: [15:31:53.578] 1. sequential: [15:31:53.578] - args: function (..., envir = parent.frame(), workers = "") [15:31:53.578] - tweaked: FALSE [15:31:53.578] - call: NULL [15:31:53.579] plan(): nbrOfWorkers() = 1 [15:31:53.581] plan(): Setting new future strategy stack: [15:31:53.581] List of future strategies: [15:31:53.581] 1. sequential: [15:31:53.581] - args: function (..., envir = parent.frame(), workers = "") [15:31:53.581] - tweaked: FALSE [15:31:53.581] - call: plan(strategy) [15:31:53.582] plan(): nbrOfWorkers() = 1 [15:31:53.583] SequentialFuture started (and completed) [15:31:53.583] - Launch lazy future ... done [15:31:53.583] run() for 'SequentialFuture' ... done [15:31:53.584] Created future: [15:31:53.584] SequentialFuture: [15:31:53.584] Label: 'future_lapply-1' [15:31:53.584] Expression: [15:31:53.584] { [15:31:53.584] do.call(function(...) { [15:31:53.584] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.584] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:53.584] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.584] on.exit(options(oopts), add = TRUE) [15:31:53.584] } [15:31:53.584] { [15:31:53.584] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:53.584] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.584] ...future.FUN(...future.X_jj, ...) [15:31:53.584] }) [15:31:53.584] } [15:31:53.584] }, args = future.call.arguments) [15:31:53.584] } [15:31:53.584] Lazy evaluation: FALSE [15:31:53.584] Asynchronous evaluation: FALSE [15:31:53.584] Local evaluation: TRUE [15:31:53.584] Environment: R_GlobalEnv [15:31:53.584] Capture standard output: TRUE [15:31:53.584] Capture condition classes: 'condition' (excluding 'nothing') [15:31:53.584] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:53.584] Packages: [15:31:53.584] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:53.584] Resolved: TRUE [15:31:53.584] Value: 240 bytes of class 'list' [15:31:53.584] Early signaling: FALSE [15:31:53.584] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:53.584] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:53.586] Chunk #1 of 1 ... DONE [15:31:53.586] Launching 1 futures (chunks) ... DONE [15:31:53.587] Resolving 1 futures (chunks) ... [15:31:53.587] resolve() on list ... [15:31:53.587] recursive: 0 [15:31:53.587] length: 1 [15:31:53.588] [15:31:53.588] resolved() for 'SequentialFuture' ... [15:31:53.588] - state: 'finished' [15:31:53.589] - run: TRUE [15:31:53.589] - result: 'FutureResult' [15:31:53.589] resolved() for 'SequentialFuture' ... done [15:31:53.590] Future #1 [15:31:53.590] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:53.590] - nx: 1 [15:31:53.590] - relay: TRUE [15:31:53.591] - stdout: TRUE [15:31:53.591] - signal: TRUE [15:31:53.591] - resignal: FALSE [15:31:53.591] - force: TRUE [15:31:53.592] - relayed: [n=1] FALSE [15:31:53.592] - queued futures: [n=1] FALSE [15:31:53.592] - until=1 [15:31:53.593] - relaying element #1 [15:31:53.593] - relayed: [n=1] TRUE [15:31:53.593] - queued futures: [n=1] TRUE [15:31:53.594] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:53.594] length: 0 (resolved future 1) [15:31:53.594] Relaying remaining futures [15:31:53.594] signalConditionsASAP(NULL, pos=0) ... [15:31:53.595] - nx: 1 [15:31:53.595] - relay: TRUE [15:31:53.595] - stdout: TRUE [15:31:53.595] - signal: TRUE [15:31:53.596] - resignal: FALSE [15:31:53.596] - force: TRUE [15:31:53.596] - relayed: [n=1] TRUE [15:31:53.596] - queued futures: [n=1] TRUE - flush all [15:31:53.597] - relayed: [n=1] TRUE [15:31:53.597] - queued futures: [n=1] TRUE [15:31:53.597] signalConditionsASAP(NULL, pos=0) ... done [15:31:53.598] resolve() on list ... DONE [15:31:53.598] - Number of value chunks collected: 1 [15:31:53.598] Resolving 1 futures (chunks) ... DONE [15:31:53.599] Reducing values from 1 chunks ... [15:31:53.599] - Number of values collected after concatenation: 4 [15:31:53.599] - Number of values expected: 4 [15:31:53.600] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [15:31:53.600] Reducing values from 1 chunks ... DONE [15:31:53.600] 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, ...) ... [15:31:53.605] future_lapply() ... [15:31:53.606] Number of chunks: 1 [15:31:53.606] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [15:31:53.606] getGlobalsAndPackagesXApply() ... [15:31:53.607] - future.globals: TRUE [15:31:53.607] getGlobalsAndPackages() ... [15:31:53.607] Searching for globals... [15:31:53.610] - globals found: [2] 'FUN', '.Internal' [15:31:53.610] Searching for globals ... DONE [15:31:53.610] Resolving globals: FALSE [15:31:53.611] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:53.612] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:53.612] - globals: [1] 'FUN' [15:31:53.612] [15:31:53.613] getGlobalsAndPackages() ... DONE [15:31:53.613] - globals found/used: [n=1] 'FUN' [15:31:53.613] - needed namespaces: [n=0] [15:31:53.613] Finding globals ... DONE [15:31:53.614] - use_args: TRUE [15:31:53.614] - Getting '...' globals ... [15:31:53.615] resolve() on list ... [15:31:53.615] recursive: 0 [15:31:53.615] length: 1 [15:31:53.615] elements: '...' [15:31:53.616] length: 0 (resolved future 1) [15:31:53.616] resolve() on list ... DONE [15:31:53.616] - '...' content: [n=1] 'length' [15:31:53.617] List of 1 [15:31:53.617] $ ...:List of 1 [15:31:53.617] ..$ length: int 2 [15:31:53.617] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.617] - attr(*, "where")=List of 1 [15:31:53.617] ..$ ...: [15:31:53.617] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.617] - attr(*, "resolved")= logi TRUE [15:31:53.617] - attr(*, "total_size")= num NA [15:31:53.622] - Getting '...' globals ... DONE [15:31:53.623] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:53.623] List of 2 [15:31:53.623] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:53.623] $ ... :List of 1 [15:31:53.623] ..$ length: int 2 [15:31:53.623] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.623] - attr(*, "where")=List of 2 [15:31:53.623] ..$ ...future.FUN: [15:31:53.623] ..$ ... : [15:31:53.623] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.623] - attr(*, "resolved")= logi FALSE [15:31:53.623] - attr(*, "total_size")= num 2240 [15:31:53.629] Packages to be attached in all futures: [n=0] [15:31:53.629] getGlobalsAndPackagesXApply() ... DONE [15:31:53.630] Number of futures (= number of chunks): 1 [15:31:53.630] Launching 1 futures (chunks) ... [15:31:53.630] Chunk #1 of 1 ... [15:31:53.631] - Finding globals in 'X' for chunk #1 ... [15:31:53.631] getGlobalsAndPackages() ... [15:31:53.631] Searching for globals... [15:31:53.632] [15:31:53.632] Searching for globals ... DONE [15:31:53.632] - globals: [0] [15:31:53.632] getGlobalsAndPackages() ... DONE [15:31:53.633] + additional globals found: [n=0] [15:31:53.633] + additional namespaces needed: [n=0] [15:31:53.633] - Finding globals in 'X' for chunk #1 ... DONE [15:31:53.634] - seeds: [15:31:53.634] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.634] getGlobalsAndPackages() ... [15:31:53.634] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.635] Resolving globals: FALSE [15:31:53.635] Tweak future expression to call with '...' arguments ... [15:31:53.635] { [15:31:53.635] do.call(function(...) { [15:31:53.635] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.635] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:53.635] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.635] on.exit(options(oopts), add = TRUE) [15:31:53.635] } [15:31:53.635] { [15:31:53.635] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:53.635] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.635] ...future.FUN(...future.X_jj, ...) [15:31:53.635] }) [15:31:53.635] } [15:31:53.635] }, args = future.call.arguments) [15:31:53.635] } [15:31:53.636] Tweak future expression to call with '...' arguments ... DONE [15:31:53.637] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.637] [15:31:53.637] getGlobalsAndPackages() ... DONE [15:31:53.638] run() for 'Future' ... [15:31:53.638] - state: 'created' [15:31:53.638] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:53.639] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:53.639] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:53.639] - Field: 'label' [15:31:53.640] - Field: 'local' [15:31:53.640] - Field: 'owner' [15:31:53.640] - Field: 'envir' [15:31:53.641] - Field: 'packages' [15:31:53.641] - Field: 'gc' [15:31:53.641] - Field: 'conditions' [15:31:53.641] - Field: 'expr' [15:31:53.642] - Field: 'uuid' [15:31:53.642] - Field: 'seed' [15:31:53.642] - Field: 'version' [15:31:53.643] - Field: 'result' [15:31:53.643] - Field: 'asynchronous' [15:31:53.643] - Field: 'calls' [15:31:53.643] - Field: 'globals' [15:31:53.644] - Field: 'stdout' [15:31:53.644] - Field: 'earlySignal' [15:31:53.644] - Field: 'lazy' [15:31:53.644] - Field: 'state' [15:31:53.645] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:53.645] - Launch lazy future ... [15:31:53.645] Packages needed by the future expression (n = 0): [15:31:53.646] Packages needed by future strategies (n = 0): [15:31:53.647] { [15:31:53.647] { [15:31:53.647] { [15:31:53.647] ...future.startTime <- base::Sys.time() [15:31:53.647] { [15:31:53.647] { [15:31:53.647] { [15:31:53.647] base::local({ [15:31:53.647] has_future <- base::requireNamespace("future", [15:31:53.647] quietly = TRUE) [15:31:53.647] if (has_future) { [15:31:53.647] ns <- base::getNamespace("future") [15:31:53.647] version <- ns[[".package"]][["version"]] [15:31:53.647] if (is.null(version)) [15:31:53.647] version <- utils::packageVersion("future") [15:31:53.647] } [15:31:53.647] else { [15:31:53.647] version <- NULL [15:31:53.647] } [15:31:53.647] if (!has_future || version < "1.8.0") { [15:31:53.647] info <- base::c(r_version = base::gsub("R version ", [15:31:53.647] "", base::R.version$version.string), [15:31:53.647] platform = base::sprintf("%s (%s-bit)", [15:31:53.647] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:53.647] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:53.647] "release", "version")], collapse = " "), [15:31:53.647] hostname = base::Sys.info()[["nodename"]]) [15:31:53.647] info <- base::sprintf("%s: %s", base::names(info), [15:31:53.647] info) [15:31:53.647] info <- base::paste(info, collapse = "; ") [15:31:53.647] if (!has_future) { [15:31:53.647] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:53.647] info) [15:31:53.647] } [15:31:53.647] else { [15:31:53.647] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:53.647] info, version) [15:31:53.647] } [15:31:53.647] base::stop(msg) [15:31:53.647] } [15:31:53.647] }) [15:31:53.647] } [15:31:53.647] ...future.strategy.old <- future::plan("list") [15:31:53.647] options(future.plan = NULL) [15:31:53.647] Sys.unsetenv("R_FUTURE_PLAN") [15:31:53.647] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:53.647] } [15:31:53.647] ...future.workdir <- getwd() [15:31:53.647] } [15:31:53.647] ...future.oldOptions <- base::as.list(base::.Options) [15:31:53.647] ...future.oldEnvVars <- base::Sys.getenv() [15:31:53.647] } [15:31:53.647] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:53.647] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:53.647] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:53.647] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:53.647] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:53.647] future.stdout.windows.reencode = NULL, width = 80L) [15:31:53.647] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:53.647] base::names(...future.oldOptions)) [15:31:53.647] } [15:31:53.647] if (FALSE) { [15:31:53.647] } [15:31:53.647] else { [15:31:53.647] if (TRUE) { [15:31:53.647] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:53.647] open = "w") [15:31:53.647] } [15:31:53.647] else { [15:31:53.647] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:53.647] windows = "NUL", "/dev/null"), open = "w") [15:31:53.647] } [15:31:53.647] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:53.647] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:53.647] base::sink(type = "output", split = FALSE) [15:31:53.647] base::close(...future.stdout) [15:31:53.647] }, add = TRUE) [15:31:53.647] } [15:31:53.647] ...future.frame <- base::sys.nframe() [15:31:53.647] ...future.conditions <- base::list() [15:31:53.647] ...future.rng <- base::globalenv()$.Random.seed [15:31:53.647] if (FALSE) { [15:31:53.647] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:53.647] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:53.647] } [15:31:53.647] ...future.result <- base::tryCatch({ [15:31:53.647] base::withCallingHandlers({ [15:31:53.647] ...future.value <- base::withVisible(base::local({ [15:31:53.647] do.call(function(...) { [15:31:53.647] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.647] if (!identical(...future.globals.maxSize.org, [15:31:53.647] ...future.globals.maxSize)) { [15:31:53.647] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.647] on.exit(options(oopts), add = TRUE) [15:31:53.647] } [15:31:53.647] { [15:31:53.647] lapply(seq_along(...future.elements_ii), [15:31:53.647] FUN = function(jj) { [15:31:53.647] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.647] ...future.FUN(...future.X_jj, ...) [15:31:53.647] }) [15:31:53.647] } [15:31:53.647] }, args = future.call.arguments) [15:31:53.647] })) [15:31:53.647] future::FutureResult(value = ...future.value$value, [15:31:53.647] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:53.647] ...future.rng), globalenv = if (FALSE) [15:31:53.647] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:53.647] ...future.globalenv.names)) [15:31:53.647] else NULL, started = ...future.startTime, version = "1.8") [15:31:53.647] }, condition = base::local({ [15:31:53.647] c <- base::c [15:31:53.647] inherits <- base::inherits [15:31:53.647] invokeRestart <- base::invokeRestart [15:31:53.647] length <- base::length [15:31:53.647] list <- base::list [15:31:53.647] seq.int <- base::seq.int [15:31:53.647] signalCondition <- base::signalCondition [15:31:53.647] sys.calls <- base::sys.calls [15:31:53.647] `[[` <- base::`[[` [15:31:53.647] `+` <- base::`+` [15:31:53.647] `<<-` <- base::`<<-` [15:31:53.647] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:53.647] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:53.647] 3L)] [15:31:53.647] } [15:31:53.647] function(cond) { [15:31:53.647] is_error <- inherits(cond, "error") [15:31:53.647] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:53.647] NULL) [15:31:53.647] if (is_error) { [15:31:53.647] sessionInformation <- function() { [15:31:53.647] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:53.647] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:53.647] search = base::search(), system = base::Sys.info()) [15:31:53.647] } [15:31:53.647] ...future.conditions[[length(...future.conditions) + [15:31:53.647] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:53.647] cond$call), session = sessionInformation(), [15:31:53.647] timestamp = base::Sys.time(), signaled = 0L) [15:31:53.647] signalCondition(cond) [15:31:53.647] } [15:31:53.647] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:53.647] "immediateCondition"))) { [15:31:53.647] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:53.647] ...future.conditions[[length(...future.conditions) + [15:31:53.647] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:53.647] if (TRUE && !signal) { [15:31:53.647] muffleCondition <- function (cond, pattern = "^muffle") [15:31:53.647] { [15:31:53.647] inherits <- base::inherits [15:31:53.647] invokeRestart <- base::invokeRestart [15:31:53.647] is.null <- base::is.null [15:31:53.647] muffled <- FALSE [15:31:53.647] if (inherits(cond, "message")) { [15:31:53.647] muffled <- grepl(pattern, "muffleMessage") [15:31:53.647] if (muffled) [15:31:53.647] invokeRestart("muffleMessage") [15:31:53.647] } [15:31:53.647] else if (inherits(cond, "warning")) { [15:31:53.647] muffled <- grepl(pattern, "muffleWarning") [15:31:53.647] if (muffled) [15:31:53.647] invokeRestart("muffleWarning") [15:31:53.647] } [15:31:53.647] else if (inherits(cond, "condition")) { [15:31:53.647] if (!is.null(pattern)) { [15:31:53.647] computeRestarts <- base::computeRestarts [15:31:53.647] grepl <- base::grepl [15:31:53.647] restarts <- computeRestarts(cond) [15:31:53.647] for (restart in restarts) { [15:31:53.647] name <- restart$name [15:31:53.647] if (is.null(name)) [15:31:53.647] next [15:31:53.647] if (!grepl(pattern, name)) [15:31:53.647] next [15:31:53.647] invokeRestart(restart) [15:31:53.647] muffled <- TRUE [15:31:53.647] break [15:31:53.647] } [15:31:53.647] } [15:31:53.647] } [15:31:53.647] invisible(muffled) [15:31:53.647] } [15:31:53.647] muffleCondition(cond, pattern = "^muffle") [15:31:53.647] } [15:31:53.647] } [15:31:53.647] else { [15:31:53.647] if (TRUE) { [15:31:53.647] muffleCondition <- function (cond, pattern = "^muffle") [15:31:53.647] { [15:31:53.647] inherits <- base::inherits [15:31:53.647] invokeRestart <- base::invokeRestart [15:31:53.647] is.null <- base::is.null [15:31:53.647] muffled <- FALSE [15:31:53.647] if (inherits(cond, "message")) { [15:31:53.647] muffled <- grepl(pattern, "muffleMessage") [15:31:53.647] if (muffled) [15:31:53.647] invokeRestart("muffleMessage") [15:31:53.647] } [15:31:53.647] else if (inherits(cond, "warning")) { [15:31:53.647] muffled <- grepl(pattern, "muffleWarning") [15:31:53.647] if (muffled) [15:31:53.647] invokeRestart("muffleWarning") [15:31:53.647] } [15:31:53.647] else if (inherits(cond, "condition")) { [15:31:53.647] if (!is.null(pattern)) { [15:31:53.647] computeRestarts <- base::computeRestarts [15:31:53.647] grepl <- base::grepl [15:31:53.647] restarts <- computeRestarts(cond) [15:31:53.647] for (restart in restarts) { [15:31:53.647] name <- restart$name [15:31:53.647] if (is.null(name)) [15:31:53.647] next [15:31:53.647] if (!grepl(pattern, name)) [15:31:53.647] next [15:31:53.647] invokeRestart(restart) [15:31:53.647] muffled <- TRUE [15:31:53.647] break [15:31:53.647] } [15:31:53.647] } [15:31:53.647] } [15:31:53.647] invisible(muffled) [15:31:53.647] } [15:31:53.647] muffleCondition(cond, pattern = "^muffle") [15:31:53.647] } [15:31:53.647] } [15:31:53.647] } [15:31:53.647] })) [15:31:53.647] }, error = function(ex) { [15:31:53.647] base::structure(base::list(value = NULL, visible = NULL, [15:31:53.647] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:53.647] ...future.rng), started = ...future.startTime, [15:31:53.647] finished = Sys.time(), session_uuid = NA_character_, [15:31:53.647] version = "1.8"), class = "FutureResult") [15:31:53.647] }, finally = { [15:31:53.647] if (!identical(...future.workdir, getwd())) [15:31:53.647] setwd(...future.workdir) [15:31:53.647] { [15:31:53.647] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:53.647] ...future.oldOptions$nwarnings <- NULL [15:31:53.647] } [15:31:53.647] base::options(...future.oldOptions) [15:31:53.647] if (.Platform$OS.type == "windows") { [15:31:53.647] old_names <- names(...future.oldEnvVars) [15:31:53.647] envs <- base::Sys.getenv() [15:31:53.647] names <- names(envs) [15:31:53.647] common <- intersect(names, old_names) [15:31:53.647] added <- setdiff(names, old_names) [15:31:53.647] removed <- setdiff(old_names, names) [15:31:53.647] changed <- common[...future.oldEnvVars[common] != [15:31:53.647] envs[common]] [15:31:53.647] NAMES <- toupper(changed) [15:31:53.647] args <- list() [15:31:53.647] for (kk in seq_along(NAMES)) { [15:31:53.647] name <- changed[[kk]] [15:31:53.647] NAME <- NAMES[[kk]] [15:31:53.647] if (name != NAME && is.element(NAME, old_names)) [15:31:53.647] next [15:31:53.647] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:53.647] } [15:31:53.647] NAMES <- toupper(added) [15:31:53.647] for (kk in seq_along(NAMES)) { [15:31:53.647] name <- added[[kk]] [15:31:53.647] NAME <- NAMES[[kk]] [15:31:53.647] if (name != NAME && is.element(NAME, old_names)) [15:31:53.647] next [15:31:53.647] args[[name]] <- "" [15:31:53.647] } [15:31:53.647] NAMES <- toupper(removed) [15:31:53.647] for (kk in seq_along(NAMES)) { [15:31:53.647] name <- removed[[kk]] [15:31:53.647] NAME <- NAMES[[kk]] [15:31:53.647] if (name != NAME && is.element(NAME, old_names)) [15:31:53.647] next [15:31:53.647] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:53.647] } [15:31:53.647] if (length(args) > 0) [15:31:53.647] base::do.call(base::Sys.setenv, args = args) [15:31:53.647] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:53.647] } [15:31:53.647] else { [15:31:53.647] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:53.647] } [15:31:53.647] { [15:31:53.647] if (base::length(...future.futureOptionsAdded) > [15:31:53.647] 0L) { [15:31:53.647] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:53.647] base::names(opts) <- ...future.futureOptionsAdded [15:31:53.647] base::options(opts) [15:31:53.647] } [15:31:53.647] { [15:31:53.647] { [15:31:53.647] NULL [15:31:53.647] RNGkind("Mersenne-Twister") [15:31:53.647] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:53.647] inherits = FALSE) [15:31:53.647] } [15:31:53.647] options(future.plan = NULL) [15:31:53.647] if (is.na(NA_character_)) [15:31:53.647] Sys.unsetenv("R_FUTURE_PLAN") [15:31:53.647] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:53.647] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:53.647] .init = FALSE) [15:31:53.647] } [15:31:53.647] } [15:31:53.647] } [15:31:53.647] }) [15:31:53.647] if (TRUE) { [15:31:53.647] base::sink(type = "output", split = FALSE) [15:31:53.647] if (TRUE) { [15:31:53.647] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:53.647] } [15:31:53.647] else { [15:31:53.647] ...future.result["stdout"] <- base::list(NULL) [15:31:53.647] } [15:31:53.647] base::close(...future.stdout) [15:31:53.647] ...future.stdout <- NULL [15:31:53.647] } [15:31:53.647] ...future.result$conditions <- ...future.conditions [15:31:53.647] ...future.result$finished <- base::Sys.time() [15:31:53.647] ...future.result [15:31:53.647] } [15:31:53.653] assign_globals() ... [15:31:53.654] List of 5 [15:31:53.654] $ ...future.FUN :function (mode = "logical", length = 0L) [15:31:53.654] $ future.call.arguments :List of 1 [15:31:53.654] ..$ length: int 2 [15:31:53.654] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.654] $ ...future.elements_ii :List of 4 [15:31:53.654] ..$ c: chr "list" [15:31:53.654] ..$ c: chr "character" [15:31:53.654] ..$ b: chr "numeric" [15:31:53.654] ..$ a: chr "integer" [15:31:53.654] $ ...future.seeds_ii : NULL [15:31:53.654] $ ...future.globals.maxSize: NULL [15:31:53.654] - attr(*, "where")=List of 5 [15:31:53.654] ..$ ...future.FUN : [15:31:53.654] ..$ future.call.arguments : [15:31:53.654] ..$ ...future.elements_ii : [15:31:53.654] ..$ ...future.seeds_ii : [15:31:53.654] ..$ ...future.globals.maxSize: [15:31:53.654] - attr(*, "resolved")= logi FALSE [15:31:53.654] - attr(*, "total_size")= num 2240 [15:31:53.654] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.654] - attr(*, "already-done")= logi TRUE [15:31:53.664] - copied '...future.FUN' to environment [15:31:53.664] - copied 'future.call.arguments' to environment [15:31:53.665] - copied '...future.elements_ii' to environment [15:31:53.665] - copied '...future.seeds_ii' to environment [15:31:53.665] - copied '...future.globals.maxSize' to environment [15:31:53.665] assign_globals() ... done [15:31:53.666] plan(): Setting new future strategy stack: [15:31:53.666] List of future strategies: [15:31:53.666] 1. sequential: [15:31:53.666] - args: function (..., envir = parent.frame(), workers = "") [15:31:53.666] - tweaked: FALSE [15:31:53.666] - call: NULL [15:31:53.667] plan(): nbrOfWorkers() = 1 [15:31:53.668] plan(): Setting new future strategy stack: [15:31:53.668] List of future strategies: [15:31:53.668] 1. sequential: [15:31:53.668] - args: function (..., envir = parent.frame(), workers = "") [15:31:53.668] - tweaked: FALSE [15:31:53.668] - call: plan(strategy) [15:31:53.669] plan(): nbrOfWorkers() = 1 [15:31:53.669] SequentialFuture started (and completed) [15:31:53.669] - Launch lazy future ... done [15:31:53.670] run() for 'SequentialFuture' ... done [15:31:53.670] Created future: [15:31:53.670] SequentialFuture: [15:31:53.670] Label: 'future_lapply-1' [15:31:53.670] Expression: [15:31:53.670] { [15:31:53.670] do.call(function(...) { [15:31:53.670] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.670] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:53.670] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.670] on.exit(options(oopts), add = TRUE) [15:31:53.670] } [15:31:53.670] { [15:31:53.670] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:53.670] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.670] ...future.FUN(...future.X_jj, ...) [15:31:53.670] }) [15:31:53.670] } [15:31:53.670] }, args = future.call.arguments) [15:31:53.670] } [15:31:53.670] Lazy evaluation: FALSE [15:31:53.670] Asynchronous evaluation: FALSE [15:31:53.670] Local evaluation: TRUE [15:31:53.670] Environment: R_GlobalEnv [15:31:53.670] Capture standard output: TRUE [15:31:53.670] Capture condition classes: 'condition' (excluding 'nothing') [15:31:53.670] Globals: 5 objects totaling 2.63 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 456 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:53.670] Packages: [15:31:53.670] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:53.670] Resolved: TRUE [15:31:53.670] Value: 240 bytes of class 'list' [15:31:53.670] Early signaling: FALSE [15:31:53.670] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:53.670] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:53.672] Chunk #1 of 1 ... DONE [15:31:53.672] Launching 1 futures (chunks) ... DONE [15:31:53.672] Resolving 1 futures (chunks) ... [15:31:53.673] resolve() on list ... [15:31:53.673] recursive: 0 [15:31:53.673] length: 1 [15:31:53.673] [15:31:53.674] resolved() for 'SequentialFuture' ... [15:31:53.674] - state: 'finished' [15:31:53.674] - run: TRUE [15:31:53.674] - result: 'FutureResult' [15:31:53.675] resolved() for 'SequentialFuture' ... done [15:31:53.675] Future #1 [15:31:53.675] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:53.676] - nx: 1 [15:31:53.676] - relay: TRUE [15:31:53.676] - stdout: TRUE [15:31:53.676] - signal: TRUE [15:31:53.677] - resignal: FALSE [15:31:53.677] - force: TRUE [15:31:53.677] - relayed: [n=1] FALSE [15:31:53.677] - queued futures: [n=1] FALSE [15:31:53.678] - until=1 [15:31:53.678] - relaying element #1 [15:31:53.678] - relayed: [n=1] TRUE [15:31:53.678] - queued futures: [n=1] TRUE [15:31:53.679] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:53.679] length: 0 (resolved future 1) [15:31:53.679] Relaying remaining futures [15:31:53.679] signalConditionsASAP(NULL, pos=0) ... [15:31:53.680] - nx: 1 [15:31:53.680] - relay: TRUE [15:31:53.680] - stdout: TRUE [15:31:53.680] - signal: TRUE [15:31:53.681] - resignal: FALSE [15:31:53.681] - force: TRUE [15:31:53.681] - relayed: [n=1] TRUE [15:31:53.681] - queued futures: [n=1] TRUE - flush all [15:31:53.682] - relayed: [n=1] TRUE [15:31:53.682] - queued futures: [n=1] TRUE [15:31:53.682] signalConditionsASAP(NULL, pos=0) ... done [15:31:53.682] resolve() on list ... DONE [15:31:53.683] - Number of value chunks collected: 1 [15:31:53.683] Resolving 1 futures (chunks) ... DONE [15:31:53.683] Reducing values from 1 chunks ... [15:31:53.684] - Number of values collected after concatenation: 4 [15:31:53.684] - Number of values expected: 4 [15:31:53.684] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [15:31:53.684] Reducing values from 1 chunks ... DONE [15:31:53.685] 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, ...) ... [15:31:53.689] future_lapply() ... [15:31:53.708] Number of chunks: 1 [15:31:53.708] getGlobalsAndPackagesXApply() ... [15:31:53.708] - future.globals: TRUE [15:31:53.709] getGlobalsAndPackages() ... [15:31:53.709] Searching for globals... [15:31:53.720] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [15:31:53.721] Searching for globals ... DONE [15:31:53.721] Resolving globals: FALSE [15:31:53.722] The total size of the 1 globals is 69.62 KiB (71288 bytes) [15:31:53.722] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 69.62 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (69.62 KiB of class 'function') [15:31:53.723] - globals: [1] 'FUN' [15:31:53.723] - packages: [1] 'future' [15:31:53.723] getGlobalsAndPackages() ... DONE [15:31:53.723] - globals found/used: [n=1] 'FUN' [15:31:53.723] - needed namespaces: [n=1] 'future' [15:31:53.723] Finding globals ... DONE [15:31:53.724] - use_args: TRUE [15:31:53.724] - Getting '...' globals ... [15:31:53.724] resolve() on list ... [15:31:53.724] recursive: 0 [15:31:53.725] length: 1 [15:31:53.725] elements: '...' [15:31:53.725] length: 0 (resolved future 1) [15:31:53.725] resolve() on list ... DONE [15:31:53.725] - '...' content: [n=2] 'collapse', 'maxHead' [15:31:53.725] List of 1 [15:31:53.725] $ ...:List of 2 [15:31:53.725] ..$ collapse: chr "; " [15:31:53.725] ..$ maxHead : int 3 [15:31:53.725] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.725] - attr(*, "where")=List of 1 [15:31:53.725] ..$ ...: [15:31:53.725] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.725] - attr(*, "resolved")= logi TRUE [15:31:53.725] - attr(*, "total_size")= num NA [15:31:53.729] - Getting '...' globals ... DONE [15:31:53.730] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:53.730] List of 2 [15:31:53.730] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:53.730] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:53.730] $ ... :List of 2 [15:31:53.730] ..$ collapse: chr "; " [15:31:53.730] ..$ maxHead : int 3 [15:31:53.730] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.730] - attr(*, "where")=List of 2 [15:31:53.730] ..$ ...future.FUN: [15:31:53.730] ..$ ... : [15:31:53.730] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.730] - attr(*, "resolved")= logi FALSE [15:31:53.730] - attr(*, "total_size")= num 71456 [15:31:53.734] Packages to be attached in all futures: [n=1] 'future' [15:31:53.734] getGlobalsAndPackagesXApply() ... DONE [15:31:53.735] Number of futures (= number of chunks): 1 [15:31:53.735] Launching 1 futures (chunks) ... [15:31:53.735] Chunk #1 of 1 ... [15:31:53.736] - Finding globals in 'X' for chunk #1 ... [15:31:53.736] getGlobalsAndPackages() ... [15:31:53.736] Searching for globals... [15:31:53.737] [15:31:53.737] Searching for globals ... DONE [15:31:53.737] - globals: [0] [15:31:53.737] getGlobalsAndPackages() ... DONE [15:31:53.738] + additional globals found: [n=0] [15:31:53.738] + additional namespaces needed: [n=0] [15:31:53.738] - Finding globals in 'X' for chunk #1 ... DONE [15:31:53.738] - seeds: [15:31:53.738] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.739] getGlobalsAndPackages() ... [15:31:53.739] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.739] Resolving globals: FALSE [15:31:53.739] Tweak future expression to call with '...' arguments ... [15:31:53.740] { [15:31:53.740] do.call(function(...) { [15:31:53.740] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.740] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:53.740] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.740] on.exit(options(oopts), add = TRUE) [15:31:53.740] } [15:31:53.740] { [15:31:53.740] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:53.740] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.740] ...future.FUN(...future.X_jj, ...) [15:31:53.740] }) [15:31:53.740] } [15:31:53.740] }, args = future.call.arguments) [15:31:53.740] } [15:31:53.740] Tweak future expression to call with '...' arguments ... DONE [15:31:53.741] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.741] - packages: [1] 'future' [15:31:53.742] getGlobalsAndPackages() ... DONE [15:31:53.742] run() for 'Future' ... [15:31:53.742] - state: 'created' [15:31:53.743] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:53.743] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:53.744] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:53.744] - Field: 'label' [15:31:53.744] - Field: 'local' [15:31:53.744] - Field: 'owner' [15:31:53.744] - Field: 'envir' [15:31:53.745] - Field: 'packages' [15:31:53.745] - Field: 'gc' [15:31:53.745] - Field: 'conditions' [15:31:53.745] - Field: 'expr' [15:31:53.746] - Field: 'uuid' [15:31:53.746] - Field: 'seed' [15:31:53.746] - Field: 'version' [15:31:53.746] - Field: 'result' [15:31:53.747] - Field: 'asynchronous' [15:31:53.747] - Field: 'calls' [15:31:53.747] - Field: 'globals' [15:31:53.747] - Field: 'stdout' [15:31:53.748] - Field: 'earlySignal' [15:31:53.748] - Field: 'lazy' [15:31:53.748] - Field: 'state' [15:31:53.748] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:53.749] - Launch lazy future ... [15:31:53.749] Packages needed by the future expression (n = 1): 'future' [15:31:53.749] Packages needed by future strategies (n = 0): [15:31:53.750] { [15:31:53.750] { [15:31:53.750] { [15:31:53.750] ...future.startTime <- base::Sys.time() [15:31:53.750] { [15:31:53.750] { [15:31:53.750] { [15:31:53.750] { [15:31:53.750] base::local({ [15:31:53.750] has_future <- base::requireNamespace("future", [15:31:53.750] quietly = TRUE) [15:31:53.750] if (has_future) { [15:31:53.750] ns <- base::getNamespace("future") [15:31:53.750] version <- ns[[".package"]][["version"]] [15:31:53.750] if (is.null(version)) [15:31:53.750] version <- utils::packageVersion("future") [15:31:53.750] } [15:31:53.750] else { [15:31:53.750] version <- NULL [15:31:53.750] } [15:31:53.750] if (!has_future || version < "1.8.0") { [15:31:53.750] info <- base::c(r_version = base::gsub("R version ", [15:31:53.750] "", base::R.version$version.string), [15:31:53.750] platform = base::sprintf("%s (%s-bit)", [15:31:53.750] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:53.750] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:53.750] "release", "version")], collapse = " "), [15:31:53.750] hostname = base::Sys.info()[["nodename"]]) [15:31:53.750] info <- base::sprintf("%s: %s", base::names(info), [15:31:53.750] info) [15:31:53.750] info <- base::paste(info, collapse = "; ") [15:31:53.750] if (!has_future) { [15:31:53.750] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:53.750] info) [15:31:53.750] } [15:31:53.750] else { [15:31:53.750] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:53.750] info, version) [15:31:53.750] } [15:31:53.750] base::stop(msg) [15:31:53.750] } [15:31:53.750] }) [15:31:53.750] } [15:31:53.750] base::local({ [15:31:53.750] for (pkg in "future") { [15:31:53.750] base::loadNamespace(pkg) [15:31:53.750] base::library(pkg, character.only = TRUE) [15:31:53.750] } [15:31:53.750] }) [15:31:53.750] } [15:31:53.750] ...future.strategy.old <- future::plan("list") [15:31:53.750] options(future.plan = NULL) [15:31:53.750] Sys.unsetenv("R_FUTURE_PLAN") [15:31:53.750] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:53.750] } [15:31:53.750] ...future.workdir <- getwd() [15:31:53.750] } [15:31:53.750] ...future.oldOptions <- base::as.list(base::.Options) [15:31:53.750] ...future.oldEnvVars <- base::Sys.getenv() [15:31:53.750] } [15:31:53.750] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:53.750] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:53.750] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:53.750] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:53.750] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:53.750] future.stdout.windows.reencode = NULL, width = 80L) [15:31:53.750] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:53.750] base::names(...future.oldOptions)) [15:31:53.750] } [15:31:53.750] if (FALSE) { [15:31:53.750] } [15:31:53.750] else { [15:31:53.750] if (TRUE) { [15:31:53.750] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:53.750] open = "w") [15:31:53.750] } [15:31:53.750] else { [15:31:53.750] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:53.750] windows = "NUL", "/dev/null"), open = "w") [15:31:53.750] } [15:31:53.750] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:53.750] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:53.750] base::sink(type = "output", split = FALSE) [15:31:53.750] base::close(...future.stdout) [15:31:53.750] }, add = TRUE) [15:31:53.750] } [15:31:53.750] ...future.frame <- base::sys.nframe() [15:31:53.750] ...future.conditions <- base::list() [15:31:53.750] ...future.rng <- base::globalenv()$.Random.seed [15:31:53.750] if (FALSE) { [15:31:53.750] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:53.750] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:53.750] } [15:31:53.750] ...future.result <- base::tryCatch({ [15:31:53.750] base::withCallingHandlers({ [15:31:53.750] ...future.value <- base::withVisible(base::local({ [15:31:53.750] do.call(function(...) { [15:31:53.750] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.750] if (!identical(...future.globals.maxSize.org, [15:31:53.750] ...future.globals.maxSize)) { [15:31:53.750] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.750] on.exit(options(oopts), add = TRUE) [15:31:53.750] } [15:31:53.750] { [15:31:53.750] lapply(seq_along(...future.elements_ii), [15:31:53.750] FUN = function(jj) { [15:31:53.750] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.750] ...future.FUN(...future.X_jj, ...) [15:31:53.750] }) [15:31:53.750] } [15:31:53.750] }, args = future.call.arguments) [15:31:53.750] })) [15:31:53.750] future::FutureResult(value = ...future.value$value, [15:31:53.750] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:53.750] ...future.rng), globalenv = if (FALSE) [15:31:53.750] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:53.750] ...future.globalenv.names)) [15:31:53.750] else NULL, started = ...future.startTime, version = "1.8") [15:31:53.750] }, condition = base::local({ [15:31:53.750] c <- base::c [15:31:53.750] inherits <- base::inherits [15:31:53.750] invokeRestart <- base::invokeRestart [15:31:53.750] length <- base::length [15:31:53.750] list <- base::list [15:31:53.750] seq.int <- base::seq.int [15:31:53.750] signalCondition <- base::signalCondition [15:31:53.750] sys.calls <- base::sys.calls [15:31:53.750] `[[` <- base::`[[` [15:31:53.750] `+` <- base::`+` [15:31:53.750] `<<-` <- base::`<<-` [15:31:53.750] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:53.750] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:53.750] 3L)] [15:31:53.750] } [15:31:53.750] function(cond) { [15:31:53.750] is_error <- inherits(cond, "error") [15:31:53.750] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:53.750] NULL) [15:31:53.750] if (is_error) { [15:31:53.750] sessionInformation <- function() { [15:31:53.750] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:53.750] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:53.750] search = base::search(), system = base::Sys.info()) [15:31:53.750] } [15:31:53.750] ...future.conditions[[length(...future.conditions) + [15:31:53.750] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:53.750] cond$call), session = sessionInformation(), [15:31:53.750] timestamp = base::Sys.time(), signaled = 0L) [15:31:53.750] signalCondition(cond) [15:31:53.750] } [15:31:53.750] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:53.750] "immediateCondition"))) { [15:31:53.750] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:53.750] ...future.conditions[[length(...future.conditions) + [15:31:53.750] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:53.750] if (TRUE && !signal) { [15:31:53.750] muffleCondition <- function (cond, pattern = "^muffle") [15:31:53.750] { [15:31:53.750] inherits <- base::inherits [15:31:53.750] invokeRestart <- base::invokeRestart [15:31:53.750] is.null <- base::is.null [15:31:53.750] muffled <- FALSE [15:31:53.750] if (inherits(cond, "message")) { [15:31:53.750] muffled <- grepl(pattern, "muffleMessage") [15:31:53.750] if (muffled) [15:31:53.750] invokeRestart("muffleMessage") [15:31:53.750] } [15:31:53.750] else if (inherits(cond, "warning")) { [15:31:53.750] muffled <- grepl(pattern, "muffleWarning") [15:31:53.750] if (muffled) [15:31:53.750] invokeRestart("muffleWarning") [15:31:53.750] } [15:31:53.750] else if (inherits(cond, "condition")) { [15:31:53.750] if (!is.null(pattern)) { [15:31:53.750] computeRestarts <- base::computeRestarts [15:31:53.750] grepl <- base::grepl [15:31:53.750] restarts <- computeRestarts(cond) [15:31:53.750] for (restart in restarts) { [15:31:53.750] name <- restart$name [15:31:53.750] if (is.null(name)) [15:31:53.750] next [15:31:53.750] if (!grepl(pattern, name)) [15:31:53.750] next [15:31:53.750] invokeRestart(restart) [15:31:53.750] muffled <- TRUE [15:31:53.750] break [15:31:53.750] } [15:31:53.750] } [15:31:53.750] } [15:31:53.750] invisible(muffled) [15:31:53.750] } [15:31:53.750] muffleCondition(cond, pattern = "^muffle") [15:31:53.750] } [15:31:53.750] } [15:31:53.750] else { [15:31:53.750] if (TRUE) { [15:31:53.750] muffleCondition <- function (cond, pattern = "^muffle") [15:31:53.750] { [15:31:53.750] inherits <- base::inherits [15:31:53.750] invokeRestart <- base::invokeRestart [15:31:53.750] is.null <- base::is.null [15:31:53.750] muffled <- FALSE [15:31:53.750] if (inherits(cond, "message")) { [15:31:53.750] muffled <- grepl(pattern, "muffleMessage") [15:31:53.750] if (muffled) [15:31:53.750] invokeRestart("muffleMessage") [15:31:53.750] } [15:31:53.750] else if (inherits(cond, "warning")) { [15:31:53.750] muffled <- grepl(pattern, "muffleWarning") [15:31:53.750] if (muffled) [15:31:53.750] invokeRestart("muffleWarning") [15:31:53.750] } [15:31:53.750] else if (inherits(cond, "condition")) { [15:31:53.750] if (!is.null(pattern)) { [15:31:53.750] computeRestarts <- base::computeRestarts [15:31:53.750] grepl <- base::grepl [15:31:53.750] restarts <- computeRestarts(cond) [15:31:53.750] for (restart in restarts) { [15:31:53.750] name <- restart$name [15:31:53.750] if (is.null(name)) [15:31:53.750] next [15:31:53.750] if (!grepl(pattern, name)) [15:31:53.750] next [15:31:53.750] invokeRestart(restart) [15:31:53.750] muffled <- TRUE [15:31:53.750] break [15:31:53.750] } [15:31:53.750] } [15:31:53.750] } [15:31:53.750] invisible(muffled) [15:31:53.750] } [15:31:53.750] muffleCondition(cond, pattern = "^muffle") [15:31:53.750] } [15:31:53.750] } [15:31:53.750] } [15:31:53.750] })) [15:31:53.750] }, error = function(ex) { [15:31:53.750] base::structure(base::list(value = NULL, visible = NULL, [15:31:53.750] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:53.750] ...future.rng), started = ...future.startTime, [15:31:53.750] finished = Sys.time(), session_uuid = NA_character_, [15:31:53.750] version = "1.8"), class = "FutureResult") [15:31:53.750] }, finally = { [15:31:53.750] if (!identical(...future.workdir, getwd())) [15:31:53.750] setwd(...future.workdir) [15:31:53.750] { [15:31:53.750] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:53.750] ...future.oldOptions$nwarnings <- NULL [15:31:53.750] } [15:31:53.750] base::options(...future.oldOptions) [15:31:53.750] if (.Platform$OS.type == "windows") { [15:31:53.750] old_names <- names(...future.oldEnvVars) [15:31:53.750] envs <- base::Sys.getenv() [15:31:53.750] names <- names(envs) [15:31:53.750] common <- intersect(names, old_names) [15:31:53.750] added <- setdiff(names, old_names) [15:31:53.750] removed <- setdiff(old_names, names) [15:31:53.750] changed <- common[...future.oldEnvVars[common] != [15:31:53.750] envs[common]] [15:31:53.750] NAMES <- toupper(changed) [15:31:53.750] args <- list() [15:31:53.750] for (kk in seq_along(NAMES)) { [15:31:53.750] name <- changed[[kk]] [15:31:53.750] NAME <- NAMES[[kk]] [15:31:53.750] if (name != NAME && is.element(NAME, old_names)) [15:31:53.750] next [15:31:53.750] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:53.750] } [15:31:53.750] NAMES <- toupper(added) [15:31:53.750] for (kk in seq_along(NAMES)) { [15:31:53.750] name <- added[[kk]] [15:31:53.750] NAME <- NAMES[[kk]] [15:31:53.750] if (name != NAME && is.element(NAME, old_names)) [15:31:53.750] next [15:31:53.750] args[[name]] <- "" [15:31:53.750] } [15:31:53.750] NAMES <- toupper(removed) [15:31:53.750] for (kk in seq_along(NAMES)) { [15:31:53.750] name <- removed[[kk]] [15:31:53.750] NAME <- NAMES[[kk]] [15:31:53.750] if (name != NAME && is.element(NAME, old_names)) [15:31:53.750] next [15:31:53.750] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:53.750] } [15:31:53.750] if (length(args) > 0) [15:31:53.750] base::do.call(base::Sys.setenv, args = args) [15:31:53.750] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:53.750] } [15:31:53.750] else { [15:31:53.750] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:53.750] } [15:31:53.750] { [15:31:53.750] if (base::length(...future.futureOptionsAdded) > [15:31:53.750] 0L) { [15:31:53.750] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:53.750] base::names(opts) <- ...future.futureOptionsAdded [15:31:53.750] base::options(opts) [15:31:53.750] } [15:31:53.750] { [15:31:53.750] { [15:31:53.750] NULL [15:31:53.750] RNGkind("Mersenne-Twister") [15:31:53.750] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:53.750] inherits = FALSE) [15:31:53.750] } [15:31:53.750] options(future.plan = NULL) [15:31:53.750] if (is.na(NA_character_)) [15:31:53.750] Sys.unsetenv("R_FUTURE_PLAN") [15:31:53.750] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:53.750] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:53.750] .init = FALSE) [15:31:53.750] } [15:31:53.750] } [15:31:53.750] } [15:31:53.750] }) [15:31:53.750] if (TRUE) { [15:31:53.750] base::sink(type = "output", split = FALSE) [15:31:53.750] if (TRUE) { [15:31:53.750] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:53.750] } [15:31:53.750] else { [15:31:53.750] ...future.result["stdout"] <- base::list(NULL) [15:31:53.750] } [15:31:53.750] base::close(...future.stdout) [15:31:53.750] ...future.stdout <- NULL [15:31:53.750] } [15:31:53.750] ...future.result$conditions <- ...future.conditions [15:31:53.750] ...future.result$finished <- base::Sys.time() [15:31:53.750] ...future.result [15:31:53.750] } [15:31:53.755] assign_globals() ... [15:31:53.755] List of 5 [15:31:53.755] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:53.755] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:53.755] $ future.call.arguments :List of 2 [15:31:53.755] ..$ collapse: chr "; " [15:31:53.755] ..$ maxHead : int 3 [15:31:53.755] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.755] $ ...future.elements_ii :List of 1 [15:31:53.755] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [15:31:53.755] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [15:31:53.755] $ ...future.seeds_ii : NULL [15:31:53.755] $ ...future.globals.maxSize: NULL [15:31:53.755] - attr(*, "where")=List of 5 [15:31:53.755] ..$ ...future.FUN : [15:31:53.755] ..$ future.call.arguments : [15:31:53.755] ..$ ...future.elements_ii : [15:31:53.755] ..$ ...future.seeds_ii : [15:31:53.755] ..$ ...future.globals.maxSize: [15:31:53.755] - attr(*, "resolved")= logi FALSE [15:31:53.755] - attr(*, "total_size")= num 71456 [15:31:53.755] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.755] - attr(*, "already-done")= logi TRUE [15:31:53.762] - copied '...future.FUN' to environment [15:31:53.763] - copied 'future.call.arguments' to environment [15:31:53.763] - copied '...future.elements_ii' to environment [15:31:53.763] - copied '...future.seeds_ii' to environment [15:31:53.763] - copied '...future.globals.maxSize' to environment [15:31:53.763] assign_globals() ... done [15:31:53.764] plan(): Setting new future strategy stack: [15:31:53.764] List of future strategies: [15:31:53.764] 1. sequential: [15:31:53.764] - args: function (..., envir = parent.frame(), workers = "") [15:31:53.764] - tweaked: FALSE [15:31:53.764] - call: NULL [15:31:53.765] plan(): nbrOfWorkers() = 1 [15:31:53.766] plan(): Setting new future strategy stack: [15:31:53.767] List of future strategies: [15:31:53.767] 1. sequential: [15:31:53.767] - args: function (..., envir = parent.frame(), workers = "") [15:31:53.767] - tweaked: FALSE [15:31:53.767] - call: plan(strategy) [15:31:53.767] plan(): nbrOfWorkers() = 1 [15:31:53.768] SequentialFuture started (and completed) [15:31:53.768] - Launch lazy future ... done [15:31:53.768] run() for 'SequentialFuture' ... done [15:31:53.768] Created future: [15:31:53.768] SequentialFuture: [15:31:53.768] Label: 'future_lapply-1' [15:31:53.768] Expression: [15:31:53.768] { [15:31:53.768] do.call(function(...) { [15:31:53.768] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.768] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:53.768] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.768] on.exit(options(oopts), add = TRUE) [15:31:53.768] } [15:31:53.768] { [15:31:53.768] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:53.768] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.768] ...future.FUN(...future.X_jj, ...) [15:31:53.768] }) [15:31:53.768] } [15:31:53.768] }, args = future.call.arguments) [15:31:53.768] } [15:31:53.768] Lazy evaluation: FALSE [15:31:53.768] Asynchronous evaluation: FALSE [15:31:53.768] Local evaluation: TRUE [15:31:53.768] Environment: R_GlobalEnv [15:31:53.768] Capture standard output: TRUE [15:31:53.768] Capture condition classes: 'condition' (excluding 'nothing') [15:31:53.768] Globals: 5 objects totaling 82.61 KiB (function '...future.FUN' of 69.62 KiB, DotDotDotList 'future.call.arguments' of 168 bytes, list '...future.elements_ii' of 12.83 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:53.768] Packages: 1 packages ('future') [15:31:53.768] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:53.768] Resolved: TRUE [15:31:53.768] Value: 136 bytes of class 'list' [15:31:53.768] Early signaling: FALSE [15:31:53.768] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:53.768] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:53.770] Chunk #1 of 1 ... DONE [15:31:53.770] Launching 1 futures (chunks) ... DONE [15:31:53.770] Resolving 1 futures (chunks) ... [15:31:53.770] resolve() on list ... [15:31:53.771] recursive: 0 [15:31:53.771] length: 1 [15:31:53.771] [15:31:53.771] resolved() for 'SequentialFuture' ... [15:31:53.771] - state: 'finished' [15:31:53.772] - run: TRUE [15:31:53.772] - result: 'FutureResult' [15:31:53.772] resolved() for 'SequentialFuture' ... done [15:31:53.772] Future #1 [15:31:53.772] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:53.773] - nx: 1 [15:31:53.773] - relay: TRUE [15:31:53.773] - stdout: TRUE [15:31:53.773] - signal: TRUE [15:31:53.773] - resignal: FALSE [15:31:53.773] - force: TRUE [15:31:53.774] - relayed: [n=1] FALSE [15:31:53.774] - queued futures: [n=1] FALSE [15:31:53.774] - until=1 [15:31:53.774] - relaying element #1 [15:31:53.774] - relayed: [n=1] TRUE [15:31:53.775] - queued futures: [n=1] TRUE [15:31:53.775] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:53.775] length: 0 (resolved future 1) [15:31:53.775] Relaying remaining futures [15:31:53.776] signalConditionsASAP(NULL, pos=0) ... [15:31:53.776] - nx: 1 [15:31:53.776] - relay: TRUE [15:31:53.776] - stdout: TRUE [15:31:53.776] - signal: TRUE [15:31:53.776] - resignal: FALSE [15:31:53.777] - force: TRUE [15:31:53.777] - relayed: [n=1] TRUE [15:31:53.777] - queued futures: [n=1] TRUE - flush all [15:31:53.777] - relayed: [n=1] TRUE [15:31:53.777] - queued futures: [n=1] TRUE [15:31:53.778] signalConditionsASAP(NULL, pos=0) ... done [15:31:53.778] resolve() on list ... DONE [15:31:53.778] - Number of value chunks collected: 1 [15:31:53.778] Resolving 1 futures (chunks) ... DONE [15:31:53.778] Reducing values from 1 chunks ... [15:31:53.779] - Number of values collected after concatenation: 1 [15:31:53.779] - Number of values expected: 1 [15:31:53.779] Reducing values from 1 chunks ... DONE [15:31:53.779] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [15:31:53.780] future_lapply() ... [15:31:53.781] Number of chunks: 1 [15:31:53.782] Index remapping (attribute 'ordering'): [n = 2] 2, 1 [15:31:53.782] getGlobalsAndPackagesXApply() ... [15:31:53.782] - future.globals: TRUE [15:31:53.782] getGlobalsAndPackages() ... [15:31:53.782] Searching for globals... [15:31:53.784] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [15:31:53.784] Searching for globals ... DONE [15:31:53.784] Resolving globals: FALSE [15:31:53.785] The total size of the 1 globals is 4.85 KiB (4968 bytes) [15:31:53.785] The total size of the 1 globals exported for future expression ('FUN()') is 4.85 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (4.85 KiB of class 'function') [15:31:53.786] - globals: [1] 'FUN' [15:31:53.786] - packages: [1] 'listenv' [15:31:53.786] getGlobalsAndPackages() ... DONE [15:31:53.786] - globals found/used: [n=1] 'FUN' [15:31:53.786] - needed namespaces: [n=1] 'listenv' [15:31:53.787] Finding globals ... DONE [15:31:53.787] - use_args: TRUE [15:31:53.787] - Getting '...' globals ... [15:31:53.787] resolve() on list ... [15:31:53.787] recursive: 0 [15:31:53.788] length: 1 [15:31:53.788] elements: '...' [15:31:53.788] length: 0 (resolved future 1) [15:31:53.788] resolve() on list ... DONE [15:31:53.788] - '...' content: [n=0] [15:31:53.789] List of 1 [15:31:53.789] $ ...: list() [15:31:53.789] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.789] - attr(*, "where")=List of 1 [15:31:53.789] ..$ ...: [15:31:53.789] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.789] - attr(*, "resolved")= logi TRUE [15:31:53.789] - attr(*, "total_size")= num NA [15:31:53.792] - Getting '...' globals ... DONE [15:31:53.792] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:53.792] List of 2 [15:31:53.792] $ ...future.FUN:function (x, ...) [15:31:53.792] $ ... : list() [15:31:53.792] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.792] - attr(*, "where")=List of 2 [15:31:53.792] ..$ ...future.FUN: [15:31:53.792] ..$ ... : [15:31:53.792] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.792] - attr(*, "resolved")= logi FALSE [15:31:53.792] - attr(*, "total_size")= num 4968 [15:31:53.796] Packages to be attached in all futures: [n=1] 'listenv' [15:31:53.796] getGlobalsAndPackagesXApply() ... DONE [15:31:53.796] Number of futures (= number of chunks): 1 [15:31:53.797] Launching 1 futures (chunks) ... [15:31:53.797] Chunk #1 of 1 ... [15:31:53.797] - Finding globals in 'X' for chunk #1 ... [15:31:53.797] getGlobalsAndPackages() ... [15:31:53.797] Searching for globals... [15:31:53.798] [15:31:53.798] Searching for globals ... DONE [15:31:53.799] - globals: [0] [15:31:53.799] getGlobalsAndPackages() ... DONE [15:31:53.799] + additional globals found: [n=0] [15:31:53.799] + additional namespaces needed: [n=0] [15:31:53.799] - Finding globals in 'X' for chunk #1 ... DONE [15:31:53.799] - seeds: [15:31:53.799] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.800] getGlobalsAndPackages() ... [15:31:53.800] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.800] Resolving globals: FALSE [15:31:53.800] Tweak future expression to call with '...' arguments ... [15:31:53.800] { [15:31:53.800] do.call(function(...) { [15:31:53.800] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.800] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:53.800] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.800] on.exit(options(oopts), add = TRUE) [15:31:53.800] } [15:31:53.800] { [15:31:53.800] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:53.800] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.800] ...future.FUN(...future.X_jj, ...) [15:31:53.800] }) [15:31:53.800] } [15:31:53.800] }, args = future.call.arguments) [15:31:53.800] } [15:31:53.801] Tweak future expression to call with '...' arguments ... DONE [15:31:53.802] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.802] - packages: [1] 'listenv' [15:31:53.802] getGlobalsAndPackages() ... DONE [15:31:53.802] run() for 'Future' ... [15:31:53.803] - state: 'created' [15:31:53.803] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:53.803] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:53.803] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:53.804] - Field: 'label' [15:31:53.804] - Field: 'local' [15:31:53.804] - Field: 'owner' [15:31:53.804] - Field: 'envir' [15:31:53.804] - Field: 'packages' [15:31:53.805] - Field: 'gc' [15:31:53.805] - Field: 'conditions' [15:31:53.805] - Field: 'expr' [15:31:53.805] - Field: 'uuid' [15:31:53.805] - Field: 'seed' [15:31:53.806] - Field: 'version' [15:31:53.806] - Field: 'result' [15:31:53.806] - Field: 'asynchronous' [15:31:53.806] - Field: 'calls' [15:31:53.806] - Field: 'globals' [15:31:53.806] - Field: 'stdout' [15:31:53.807] - Field: 'earlySignal' [15:31:53.807] - Field: 'lazy' [15:31:53.807] - Field: 'state' [15:31:53.807] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:53.807] - Launch lazy future ... [15:31:53.808] Packages needed by the future expression (n = 1): 'listenv' [15:31:53.808] Packages needed by future strategies (n = 0): [15:31:53.809] { [15:31:53.809] { [15:31:53.809] { [15:31:53.809] ...future.startTime <- base::Sys.time() [15:31:53.809] { [15:31:53.809] { [15:31:53.809] { [15:31:53.809] { [15:31:53.809] base::local({ [15:31:53.809] has_future <- base::requireNamespace("future", [15:31:53.809] quietly = TRUE) [15:31:53.809] if (has_future) { [15:31:53.809] ns <- base::getNamespace("future") [15:31:53.809] version <- ns[[".package"]][["version"]] [15:31:53.809] if (is.null(version)) [15:31:53.809] version <- utils::packageVersion("future") [15:31:53.809] } [15:31:53.809] else { [15:31:53.809] version <- NULL [15:31:53.809] } [15:31:53.809] if (!has_future || version < "1.8.0") { [15:31:53.809] info <- base::c(r_version = base::gsub("R version ", [15:31:53.809] "", base::R.version$version.string), [15:31:53.809] platform = base::sprintf("%s (%s-bit)", [15:31:53.809] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:53.809] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:53.809] "release", "version")], collapse = " "), [15:31:53.809] hostname = base::Sys.info()[["nodename"]]) [15:31:53.809] info <- base::sprintf("%s: %s", base::names(info), [15:31:53.809] info) [15:31:53.809] info <- base::paste(info, collapse = "; ") [15:31:53.809] if (!has_future) { [15:31:53.809] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:53.809] info) [15:31:53.809] } [15:31:53.809] else { [15:31:53.809] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:53.809] info, version) [15:31:53.809] } [15:31:53.809] base::stop(msg) [15:31:53.809] } [15:31:53.809] }) [15:31:53.809] } [15:31:53.809] base::local({ [15:31:53.809] for (pkg in "listenv") { [15:31:53.809] base::loadNamespace(pkg) [15:31:53.809] base::library(pkg, character.only = TRUE) [15:31:53.809] } [15:31:53.809] }) [15:31:53.809] } [15:31:53.809] ...future.strategy.old <- future::plan("list") [15:31:53.809] options(future.plan = NULL) [15:31:53.809] Sys.unsetenv("R_FUTURE_PLAN") [15:31:53.809] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:53.809] } [15:31:53.809] ...future.workdir <- getwd() [15:31:53.809] } [15:31:53.809] ...future.oldOptions <- base::as.list(base::.Options) [15:31:53.809] ...future.oldEnvVars <- base::Sys.getenv() [15:31:53.809] } [15:31:53.809] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:53.809] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:53.809] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:53.809] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:53.809] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:53.809] future.stdout.windows.reencode = NULL, width = 80L) [15:31:53.809] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:53.809] base::names(...future.oldOptions)) [15:31:53.809] } [15:31:53.809] if (FALSE) { [15:31:53.809] } [15:31:53.809] else { [15:31:53.809] if (TRUE) { [15:31:53.809] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:53.809] open = "w") [15:31:53.809] } [15:31:53.809] else { [15:31:53.809] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:53.809] windows = "NUL", "/dev/null"), open = "w") [15:31:53.809] } [15:31:53.809] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:53.809] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:53.809] base::sink(type = "output", split = FALSE) [15:31:53.809] base::close(...future.stdout) [15:31:53.809] }, add = TRUE) [15:31:53.809] } [15:31:53.809] ...future.frame <- base::sys.nframe() [15:31:53.809] ...future.conditions <- base::list() [15:31:53.809] ...future.rng <- base::globalenv()$.Random.seed [15:31:53.809] if (FALSE) { [15:31:53.809] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:53.809] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:53.809] } [15:31:53.809] ...future.result <- base::tryCatch({ [15:31:53.809] base::withCallingHandlers({ [15:31:53.809] ...future.value <- base::withVisible(base::local({ [15:31:53.809] do.call(function(...) { [15:31:53.809] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.809] if (!identical(...future.globals.maxSize.org, [15:31:53.809] ...future.globals.maxSize)) { [15:31:53.809] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.809] on.exit(options(oopts), add = TRUE) [15:31:53.809] } [15:31:53.809] { [15:31:53.809] lapply(seq_along(...future.elements_ii), [15:31:53.809] FUN = function(jj) { [15:31:53.809] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.809] ...future.FUN(...future.X_jj, ...) [15:31:53.809] }) [15:31:53.809] } [15:31:53.809] }, args = future.call.arguments) [15:31:53.809] })) [15:31:53.809] future::FutureResult(value = ...future.value$value, [15:31:53.809] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:53.809] ...future.rng), globalenv = if (FALSE) [15:31:53.809] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:53.809] ...future.globalenv.names)) [15:31:53.809] else NULL, started = ...future.startTime, version = "1.8") [15:31:53.809] }, condition = base::local({ [15:31:53.809] c <- base::c [15:31:53.809] inherits <- base::inherits [15:31:53.809] invokeRestart <- base::invokeRestart [15:31:53.809] length <- base::length [15:31:53.809] list <- base::list [15:31:53.809] seq.int <- base::seq.int [15:31:53.809] signalCondition <- base::signalCondition [15:31:53.809] sys.calls <- base::sys.calls [15:31:53.809] `[[` <- base::`[[` [15:31:53.809] `+` <- base::`+` [15:31:53.809] `<<-` <- base::`<<-` [15:31:53.809] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:53.809] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:53.809] 3L)] [15:31:53.809] } [15:31:53.809] function(cond) { [15:31:53.809] is_error <- inherits(cond, "error") [15:31:53.809] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:53.809] NULL) [15:31:53.809] if (is_error) { [15:31:53.809] sessionInformation <- function() { [15:31:53.809] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:53.809] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:53.809] search = base::search(), system = base::Sys.info()) [15:31:53.809] } [15:31:53.809] ...future.conditions[[length(...future.conditions) + [15:31:53.809] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:53.809] cond$call), session = sessionInformation(), [15:31:53.809] timestamp = base::Sys.time(), signaled = 0L) [15:31:53.809] signalCondition(cond) [15:31:53.809] } [15:31:53.809] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:53.809] "immediateCondition"))) { [15:31:53.809] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:53.809] ...future.conditions[[length(...future.conditions) + [15:31:53.809] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:53.809] if (TRUE && !signal) { [15:31:53.809] muffleCondition <- function (cond, pattern = "^muffle") [15:31:53.809] { [15:31:53.809] inherits <- base::inherits [15:31:53.809] invokeRestart <- base::invokeRestart [15:31:53.809] is.null <- base::is.null [15:31:53.809] muffled <- FALSE [15:31:53.809] if (inherits(cond, "message")) { [15:31:53.809] muffled <- grepl(pattern, "muffleMessage") [15:31:53.809] if (muffled) [15:31:53.809] invokeRestart("muffleMessage") [15:31:53.809] } [15:31:53.809] else if (inherits(cond, "warning")) { [15:31:53.809] muffled <- grepl(pattern, "muffleWarning") [15:31:53.809] if (muffled) [15:31:53.809] invokeRestart("muffleWarning") [15:31:53.809] } [15:31:53.809] else if (inherits(cond, "condition")) { [15:31:53.809] if (!is.null(pattern)) { [15:31:53.809] computeRestarts <- base::computeRestarts [15:31:53.809] grepl <- base::grepl [15:31:53.809] restarts <- computeRestarts(cond) [15:31:53.809] for (restart in restarts) { [15:31:53.809] name <- restart$name [15:31:53.809] if (is.null(name)) [15:31:53.809] next [15:31:53.809] if (!grepl(pattern, name)) [15:31:53.809] next [15:31:53.809] invokeRestart(restart) [15:31:53.809] muffled <- TRUE [15:31:53.809] break [15:31:53.809] } [15:31:53.809] } [15:31:53.809] } [15:31:53.809] invisible(muffled) [15:31:53.809] } [15:31:53.809] muffleCondition(cond, pattern = "^muffle") [15:31:53.809] } [15:31:53.809] } [15:31:53.809] else { [15:31:53.809] if (TRUE) { [15:31:53.809] muffleCondition <- function (cond, pattern = "^muffle") [15:31:53.809] { [15:31:53.809] inherits <- base::inherits [15:31:53.809] invokeRestart <- base::invokeRestart [15:31:53.809] is.null <- base::is.null [15:31:53.809] muffled <- FALSE [15:31:53.809] if (inherits(cond, "message")) { [15:31:53.809] muffled <- grepl(pattern, "muffleMessage") [15:31:53.809] if (muffled) [15:31:53.809] invokeRestart("muffleMessage") [15:31:53.809] } [15:31:53.809] else if (inherits(cond, "warning")) { [15:31:53.809] muffled <- grepl(pattern, "muffleWarning") [15:31:53.809] if (muffled) [15:31:53.809] invokeRestart("muffleWarning") [15:31:53.809] } [15:31:53.809] else if (inherits(cond, "condition")) { [15:31:53.809] if (!is.null(pattern)) { [15:31:53.809] computeRestarts <- base::computeRestarts [15:31:53.809] grepl <- base::grepl [15:31:53.809] restarts <- computeRestarts(cond) [15:31:53.809] for (restart in restarts) { [15:31:53.809] name <- restart$name [15:31:53.809] if (is.null(name)) [15:31:53.809] next [15:31:53.809] if (!grepl(pattern, name)) [15:31:53.809] next [15:31:53.809] invokeRestart(restart) [15:31:53.809] muffled <- TRUE [15:31:53.809] break [15:31:53.809] } [15:31:53.809] } [15:31:53.809] } [15:31:53.809] invisible(muffled) [15:31:53.809] } [15:31:53.809] muffleCondition(cond, pattern = "^muffle") [15:31:53.809] } [15:31:53.809] } [15:31:53.809] } [15:31:53.809] })) [15:31:53.809] }, error = function(ex) { [15:31:53.809] base::structure(base::list(value = NULL, visible = NULL, [15:31:53.809] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:53.809] ...future.rng), started = ...future.startTime, [15:31:53.809] finished = Sys.time(), session_uuid = NA_character_, [15:31:53.809] version = "1.8"), class = "FutureResult") [15:31:53.809] }, finally = { [15:31:53.809] if (!identical(...future.workdir, getwd())) [15:31:53.809] setwd(...future.workdir) [15:31:53.809] { [15:31:53.809] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:53.809] ...future.oldOptions$nwarnings <- NULL [15:31:53.809] } [15:31:53.809] base::options(...future.oldOptions) [15:31:53.809] if (.Platform$OS.type == "windows") { [15:31:53.809] old_names <- names(...future.oldEnvVars) [15:31:53.809] envs <- base::Sys.getenv() [15:31:53.809] names <- names(envs) [15:31:53.809] common <- intersect(names, old_names) [15:31:53.809] added <- setdiff(names, old_names) [15:31:53.809] removed <- setdiff(old_names, names) [15:31:53.809] changed <- common[...future.oldEnvVars[common] != [15:31:53.809] envs[common]] [15:31:53.809] NAMES <- toupper(changed) [15:31:53.809] args <- list() [15:31:53.809] for (kk in seq_along(NAMES)) { [15:31:53.809] name <- changed[[kk]] [15:31:53.809] NAME <- NAMES[[kk]] [15:31:53.809] if (name != NAME && is.element(NAME, old_names)) [15:31:53.809] next [15:31:53.809] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:53.809] } [15:31:53.809] NAMES <- toupper(added) [15:31:53.809] for (kk in seq_along(NAMES)) { [15:31:53.809] name <- added[[kk]] [15:31:53.809] NAME <- NAMES[[kk]] [15:31:53.809] if (name != NAME && is.element(NAME, old_names)) [15:31:53.809] next [15:31:53.809] args[[name]] <- "" [15:31:53.809] } [15:31:53.809] NAMES <- toupper(removed) [15:31:53.809] for (kk in seq_along(NAMES)) { [15:31:53.809] name <- removed[[kk]] [15:31:53.809] NAME <- NAMES[[kk]] [15:31:53.809] if (name != NAME && is.element(NAME, old_names)) [15:31:53.809] next [15:31:53.809] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:53.809] } [15:31:53.809] if (length(args) > 0) [15:31:53.809] base::do.call(base::Sys.setenv, args = args) [15:31:53.809] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:53.809] } [15:31:53.809] else { [15:31:53.809] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:53.809] } [15:31:53.809] { [15:31:53.809] if (base::length(...future.futureOptionsAdded) > [15:31:53.809] 0L) { [15:31:53.809] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:53.809] base::names(opts) <- ...future.futureOptionsAdded [15:31:53.809] base::options(opts) [15:31:53.809] } [15:31:53.809] { [15:31:53.809] { [15:31:53.809] NULL [15:31:53.809] RNGkind("Mersenne-Twister") [15:31:53.809] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:53.809] inherits = FALSE) [15:31:53.809] } [15:31:53.809] options(future.plan = NULL) [15:31:53.809] if (is.na(NA_character_)) [15:31:53.809] Sys.unsetenv("R_FUTURE_PLAN") [15:31:53.809] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:53.809] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:53.809] .init = FALSE) [15:31:53.809] } [15:31:53.809] } [15:31:53.809] } [15:31:53.809] }) [15:31:53.809] if (TRUE) { [15:31:53.809] base::sink(type = "output", split = FALSE) [15:31:53.809] if (TRUE) { [15:31:53.809] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:53.809] } [15:31:53.809] else { [15:31:53.809] ...future.result["stdout"] <- base::list(NULL) [15:31:53.809] } [15:31:53.809] base::close(...future.stdout) [15:31:53.809] ...future.stdout <- NULL [15:31:53.809] } [15:31:53.809] ...future.result$conditions <- ...future.conditions [15:31:53.809] ...future.result$finished <- base::Sys.time() [15:31:53.809] ...future.result [15:31:53.809] } [15:31:53.813] assign_globals() ... [15:31:53.813] List of 5 [15:31:53.813] $ ...future.FUN :function (x, ...) [15:31:53.813] $ future.call.arguments : list() [15:31:53.813] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.813] $ ...future.elements_ii :List of 2 [15:31:53.813] ..$ b:Classes 'listenv', 'environment' [15:31:53.813] ..$ a:Classes 'listenv', 'environment' [15:31:53.813] $ ...future.seeds_ii : NULL [15:31:53.813] $ ...future.globals.maxSize: NULL [15:31:53.813] - attr(*, "where")=List of 5 [15:31:53.813] ..$ ...future.FUN : [15:31:53.813] ..$ future.call.arguments : [15:31:53.813] ..$ ...future.elements_ii : [15:31:53.813] ..$ ...future.seeds_ii : [15:31:53.813] ..$ ...future.globals.maxSize: [15:31:53.813] - attr(*, "resolved")= logi FALSE [15:31:53.813] - attr(*, "total_size")= num 4968 [15:31:53.813] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.813] - attr(*, "already-done")= logi TRUE [15:31:53.826] - copied '...future.FUN' to environment [15:31:53.826] - copied 'future.call.arguments' to environment [15:31:53.826] - copied '...future.elements_ii' to environment [15:31:53.826] - copied '...future.seeds_ii' to environment [15:31:53.826] - copied '...future.globals.maxSize' to environment [15:31:53.827] assign_globals() ... done [15:31:53.828] plan(): Setting new future strategy stack: [15:31:53.828] List of future strategies: [15:31:53.828] 1. sequential: [15:31:53.828] - args: function (..., envir = parent.frame(), workers = "") [15:31:53.828] - tweaked: FALSE [15:31:53.828] - call: NULL [15:31:53.829] plan(): nbrOfWorkers() = 1 [15:31:53.831] plan(): Setting new future strategy stack: [15:31:53.831] List of future strategies: [15:31:53.831] 1. sequential: [15:31:53.831] - args: function (..., envir = parent.frame(), workers = "") [15:31:53.831] - tweaked: FALSE [15:31:53.831] - call: plan(strategy) [15:31:53.833] plan(): nbrOfWorkers() = 1 [15:31:53.833] SequentialFuture started (and completed) [15:31:53.833] - Launch lazy future ... done [15:31:53.834] run() for 'SequentialFuture' ... done [15:31:53.834] Created future: [15:31:53.834] SequentialFuture: [15:31:53.834] Label: 'future_lapply-1' [15:31:53.834] Expression: [15:31:53.834] { [15:31:53.834] do.call(function(...) { [15:31:53.834] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.834] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:53.834] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.834] on.exit(options(oopts), add = TRUE) [15:31:53.834] } [15:31:53.834] { [15:31:53.834] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:53.834] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.834] ...future.FUN(...future.X_jj, ...) [15:31:53.834] }) [15:31:53.834] } [15:31:53.834] }, args = future.call.arguments) [15:31:53.834] } [15:31:53.834] Lazy evaluation: FALSE [15:31:53.834] Asynchronous evaluation: FALSE [15:31:53.834] Local evaluation: TRUE [15:31:53.834] Environment: R_GlobalEnv [15:31:53.834] Capture standard output: TRUE [15:31:53.834] Capture condition classes: 'condition' (excluding 'nothing') [15:31:53.834] Globals: 5 objects totaling 17.90 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 13.05 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:53.834] Packages: 1 packages ('listenv') [15:31:53.834] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:53.834] Resolved: TRUE [15:31:53.834] Value: 800 bytes of class 'list' [15:31:53.834] Early signaling: FALSE [15:31:53.834] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:53.834] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:53.837] Chunk #1 of 1 ... DONE [15:31:53.837] Launching 1 futures (chunks) ... DONE [15:31:53.838] Resolving 1 futures (chunks) ... [15:31:53.838] resolve() on list ... [15:31:53.838] recursive: 0 [15:31:53.839] length: 1 [15:31:53.839] [15:31:53.839] resolved() for 'SequentialFuture' ... [15:31:53.840] - state: 'finished' [15:31:53.840] - run: TRUE [15:31:53.840] - result: 'FutureResult' [15:31:53.841] resolved() for 'SequentialFuture' ... done [15:31:53.841] Future #1 [15:31:53.841] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:53.842] - nx: 1 [15:31:53.842] - relay: TRUE [15:31:53.842] - stdout: TRUE [15:31:53.842] - signal: TRUE [15:31:53.843] - resignal: FALSE [15:31:53.843] - force: TRUE [15:31:53.843] - relayed: [n=1] FALSE [15:31:53.844] - queued futures: [n=1] FALSE [15:31:53.844] - until=1 [15:31:53.844] - relaying element #1 [15:31:53.845] - relayed: [n=1] TRUE [15:31:53.845] - queued futures: [n=1] TRUE [15:31:53.845] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:53.846] length: 0 (resolved future 1) [15:31:53.846] Relaying remaining futures [15:31:53.846] signalConditionsASAP(NULL, pos=0) ... [15:31:53.847] - nx: 1 [15:31:53.847] - relay: TRUE [15:31:53.847] - stdout: TRUE [15:31:53.847] - signal: TRUE [15:31:53.848] - resignal: FALSE [15:31:53.848] - force: TRUE [15:31:53.848] - relayed: [n=1] TRUE [15:31:53.848] - queued futures: [n=1] TRUE - flush all [15:31:53.849] - relayed: [n=1] TRUE [15:31:53.849] - queued futures: [n=1] TRUE [15:31:53.849] signalConditionsASAP(NULL, pos=0) ... done [15:31:53.850] resolve() on list ... DONE [15:31:53.850] - Number of value chunks collected: 1 [15:31:53.851] Resolving 1 futures (chunks) ... DONE [15:31:53.851] Reducing values from 1 chunks ... [15:31:53.851] - Number of values collected after concatenation: 2 [15:31:53.851] - Number of values expected: 2 [15:31:53.852] Reverse index remapping (attribute 'ordering'): [n = 2] 2, 1 [15:31:53.852] Reducing values from 1 chunks ... DONE [15:31:53.852] 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) ... [15:31:53.856] future_lapply() ... [15:31:53.858] Number of chunks: 1 [15:31:53.858] getGlobalsAndPackagesXApply() ... [15:31:53.858] - future.globals: TRUE [15:31:53.859] getGlobalsAndPackages() ... [15:31:53.859] Searching for globals... [15:31:53.861] - globals found: [4] 'FUN', 'sqrt', '+', 'a' [15:31:53.862] Searching for globals ... DONE [15:31:53.862] Resolving globals: FALSE [15:31:53.863] The total size of the 2 globals is 1.93 KiB (1976 bytes) [15:31:53.864] The total size of the 2 globals exported for future expression ('FUN()') is 1.93 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are two globals: 'FUN' (1.88 KiB of class 'function') and 'a' (56 bytes of class 'numeric') [15:31:53.864] - globals: [2] 'FUN', 'a' [15:31:53.864] [15:31:53.865] getGlobalsAndPackages() ... DONE [15:31:53.865] - globals found/used: [n=2] 'FUN', 'a' [15:31:53.865] - needed namespaces: [n=0] [15:31:53.866] Finding globals ... DONE [15:31:53.866] - use_args: TRUE [15:31:53.866] - Getting '...' globals ... [15:31:53.867] resolve() on list ... [15:31:53.867] recursive: 0 [15:31:53.867] length: 1 [15:31:53.868] elements: '...' [15:31:53.868] length: 0 (resolved future 1) [15:31:53.868] resolve() on list ... DONE [15:31:53.868] - '...' content: [n=0] [15:31:53.869] List of 1 [15:31:53.869] $ ...: list() [15:31:53.869] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.869] - attr(*, "where")=List of 1 [15:31:53.869] ..$ ...: [15:31:53.869] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.869] - attr(*, "resolved")= logi TRUE [15:31:53.869] - attr(*, "total_size")= num NA [15:31:53.874] - Getting '...' globals ... DONE [15:31:53.874] Globals to be used in all futures (chunks): [n=3] '...future.FUN', 'a', '...' [15:31:53.875] List of 3 [15:31:53.875] $ ...future.FUN:function (z) [15:31:53.875] $ a : num 3.14 [15:31:53.875] $ ... : list() [15:31:53.875] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.875] - attr(*, "where")=List of 3 [15:31:53.875] ..$ ...future.FUN: [15:31:53.875] ..$ a : [15:31:53.875] ..$ ... : [15:31:53.875] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.875] - attr(*, "resolved")= logi FALSE [15:31:53.875] - attr(*, "total_size")= num 1976 [15:31:53.881] Packages to be attached in all futures: [n=0] [15:31:53.881] getGlobalsAndPackagesXApply() ... DONE [15:31:53.882] Number of futures (= number of chunks): 1 [15:31:53.882] Launching 1 futures (chunks) ... [15:31:53.883] Chunk #1 of 1 ... [15:31:53.885] - Finding globals in 'X' for chunk #1 ... [15:31:53.885] getGlobalsAndPackages() ... [15:31:53.886] Searching for globals... [15:31:53.899] [15:31:53.900] Searching for globals ... DONE [15:31:53.900] - globals: [0] [15:31:53.900] getGlobalsAndPackages() ... DONE [15:31:53.901] + additional globals found: [n=0] [15:31:53.901] + additional namespaces needed: [n=0] [15:31:53.901] - Finding globals in 'X' for chunk #1 ... DONE [15:31:53.901] - seeds: [15:31:53.902] - All globals exported: [n=6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.902] getGlobalsAndPackages() ... [15:31:53.902] - globals passed as-is: [6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.903] Resolving globals: FALSE [15:31:53.903] Tweak future expression to call with '...' arguments ... [15:31:53.903] { [15:31:53.903] do.call(function(...) { [15:31:53.903] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.903] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:53.903] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.903] on.exit(options(oopts), add = TRUE) [15:31:53.903] } [15:31:53.903] { [15:31:53.903] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:53.903] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.903] ...future.FUN(...future.X_jj, ...) [15:31:53.903] }) [15:31:53.903] } [15:31:53.903] }, args = future.call.arguments) [15:31:53.903] } [15:31:53.904] Tweak future expression to call with '...' arguments ... DONE [15:31:53.905] - globals: [6] '...future.FUN', 'a', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:53.905] [15:31:53.906] getGlobalsAndPackages() ... DONE [15:31:53.906] run() for 'Future' ... [15:31:53.907] - state: 'created' [15:31:53.907] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:53.908] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:53.908] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:53.908] - Field: 'label' [15:31:53.909] - Field: 'local' [15:31:53.909] - Field: 'owner' [15:31:53.909] - Field: 'envir' [15:31:53.909] - Field: 'packages' [15:31:53.910] - Field: 'gc' [15:31:53.910] - Field: 'conditions' [15:31:53.910] - Field: 'expr' [15:31:53.910] - Field: 'uuid' [15:31:53.911] - Field: 'seed' [15:31:53.911] - Field: 'version' [15:31:53.911] - Field: 'result' [15:31:53.912] - Field: 'asynchronous' [15:31:53.912] - Field: 'calls' [15:31:53.912] - Field: 'globals' [15:31:53.912] - Field: 'stdout' [15:31:53.913] - Field: 'earlySignal' [15:31:53.913] - Field: 'lazy' [15:31:53.913] - Field: 'state' [15:31:53.914] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:53.914] - Launch lazy future ... [15:31:53.915] Packages needed by the future expression (n = 0): [15:31:53.915] Packages needed by future strategies (n = 0): [15:31:53.916] { [15:31:53.916] { [15:31:53.916] { [15:31:53.916] ...future.startTime <- base::Sys.time() [15:31:53.916] { [15:31:53.916] { [15:31:53.916] { [15:31:53.916] base::local({ [15:31:53.916] has_future <- base::requireNamespace("future", [15:31:53.916] quietly = TRUE) [15:31:53.916] if (has_future) { [15:31:53.916] ns <- base::getNamespace("future") [15:31:53.916] version <- ns[[".package"]][["version"]] [15:31:53.916] if (is.null(version)) [15:31:53.916] version <- utils::packageVersion("future") [15:31:53.916] } [15:31:53.916] else { [15:31:53.916] version <- NULL [15:31:53.916] } [15:31:53.916] if (!has_future || version < "1.8.0") { [15:31:53.916] info <- base::c(r_version = base::gsub("R version ", [15:31:53.916] "", base::R.version$version.string), [15:31:53.916] platform = base::sprintf("%s (%s-bit)", [15:31:53.916] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:53.916] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:53.916] "release", "version")], collapse = " "), [15:31:53.916] hostname = base::Sys.info()[["nodename"]]) [15:31:53.916] info <- base::sprintf("%s: %s", base::names(info), [15:31:53.916] info) [15:31:53.916] info <- base::paste(info, collapse = "; ") [15:31:53.916] if (!has_future) { [15:31:53.916] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:53.916] info) [15:31:53.916] } [15:31:53.916] else { [15:31:53.916] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:53.916] info, version) [15:31:53.916] } [15:31:53.916] base::stop(msg) [15:31:53.916] } [15:31:53.916] }) [15:31:53.916] } [15:31:53.916] ...future.strategy.old <- future::plan("list") [15:31:53.916] options(future.plan = NULL) [15:31:53.916] Sys.unsetenv("R_FUTURE_PLAN") [15:31:53.916] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:53.916] } [15:31:53.916] ...future.workdir <- getwd() [15:31:53.916] } [15:31:53.916] ...future.oldOptions <- base::as.list(base::.Options) [15:31:53.916] ...future.oldEnvVars <- base::Sys.getenv() [15:31:53.916] } [15:31:53.916] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:53.916] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:53.916] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:53.916] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:53.916] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:53.916] future.stdout.windows.reencode = NULL, width = 80L) [15:31:53.916] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:53.916] base::names(...future.oldOptions)) [15:31:53.916] } [15:31:53.916] if (FALSE) { [15:31:53.916] } [15:31:53.916] else { [15:31:53.916] if (TRUE) { [15:31:53.916] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:53.916] open = "w") [15:31:53.916] } [15:31:53.916] else { [15:31:53.916] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:53.916] windows = "NUL", "/dev/null"), open = "w") [15:31:53.916] } [15:31:53.916] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:53.916] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:53.916] base::sink(type = "output", split = FALSE) [15:31:53.916] base::close(...future.stdout) [15:31:53.916] }, add = TRUE) [15:31:53.916] } [15:31:53.916] ...future.frame <- base::sys.nframe() [15:31:53.916] ...future.conditions <- base::list() [15:31:53.916] ...future.rng <- base::globalenv()$.Random.seed [15:31:53.916] if (FALSE) { [15:31:53.916] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:53.916] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:53.916] } [15:31:53.916] ...future.result <- base::tryCatch({ [15:31:53.916] base::withCallingHandlers({ [15:31:53.916] ...future.value <- base::withVisible(base::local({ [15:31:53.916] do.call(function(...) { [15:31:53.916] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:53.916] if (!identical(...future.globals.maxSize.org, [15:31:53.916] ...future.globals.maxSize)) { [15:31:53.916] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:53.916] on.exit(options(oopts), add = TRUE) [15:31:53.916] } [15:31:53.916] { [15:31:53.916] lapply(seq_along(...future.elements_ii), [15:31:53.916] FUN = function(jj) { [15:31:53.916] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:53.916] ...future.FUN(...future.X_jj, ...) [15:31:53.916] }) [15:31:53.916] } [15:31:53.916] }, args = future.call.arguments) [15:31:53.916] })) [15:31:53.916] future::FutureResult(value = ...future.value$value, [15:31:53.916] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:53.916] ...future.rng), globalenv = if (FALSE) [15:31:53.916] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:53.916] ...future.globalenv.names)) [15:31:53.916] else NULL, started = ...future.startTime, version = "1.8") [15:31:53.916] }, condition = base::local({ [15:31:53.916] c <- base::c [15:31:53.916] inherits <- base::inherits [15:31:53.916] invokeRestart <- base::invokeRestart [15:31:53.916] length <- base::length [15:31:53.916] list <- base::list [15:31:53.916] seq.int <- base::seq.int [15:31:53.916] signalCondition <- base::signalCondition [15:31:53.916] sys.calls <- base::sys.calls [15:31:53.916] `[[` <- base::`[[` [15:31:53.916] `+` <- base::`+` [15:31:53.916] `<<-` <- base::`<<-` [15:31:53.916] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:53.916] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:53.916] 3L)] [15:31:53.916] } [15:31:53.916] function(cond) { [15:31:53.916] is_error <- inherits(cond, "error") [15:31:53.916] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:53.916] NULL) [15:31:53.916] if (is_error) { [15:31:53.916] sessionInformation <- function() { [15:31:53.916] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:53.916] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:53.916] search = base::search(), system = base::Sys.info()) [15:31:53.916] } [15:31:53.916] ...future.conditions[[length(...future.conditions) + [15:31:53.916] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:53.916] cond$call), session = sessionInformation(), [15:31:53.916] timestamp = base::Sys.time(), signaled = 0L) [15:31:53.916] signalCondition(cond) [15:31:53.916] } [15:31:53.916] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:53.916] "immediateCondition"))) { [15:31:53.916] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:53.916] ...future.conditions[[length(...future.conditions) + [15:31:53.916] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:53.916] if (TRUE && !signal) { [15:31:53.916] muffleCondition <- function (cond, pattern = "^muffle") [15:31:53.916] { [15:31:53.916] inherits <- base::inherits [15:31:53.916] invokeRestart <- base::invokeRestart [15:31:53.916] is.null <- base::is.null [15:31:53.916] muffled <- FALSE [15:31:53.916] if (inherits(cond, "message")) { [15:31:53.916] muffled <- grepl(pattern, "muffleMessage") [15:31:53.916] if (muffled) [15:31:53.916] invokeRestart("muffleMessage") [15:31:53.916] } [15:31:53.916] else if (inherits(cond, "warning")) { [15:31:53.916] muffled <- grepl(pattern, "muffleWarning") [15:31:53.916] if (muffled) [15:31:53.916] invokeRestart("muffleWarning") [15:31:53.916] } [15:31:53.916] else if (inherits(cond, "condition")) { [15:31:53.916] if (!is.null(pattern)) { [15:31:53.916] computeRestarts <- base::computeRestarts [15:31:53.916] grepl <- base::grepl [15:31:53.916] restarts <- computeRestarts(cond) [15:31:53.916] for (restart in restarts) { [15:31:53.916] name <- restart$name [15:31:53.916] if (is.null(name)) [15:31:53.916] next [15:31:53.916] if (!grepl(pattern, name)) [15:31:53.916] next [15:31:53.916] invokeRestart(restart) [15:31:53.916] muffled <- TRUE [15:31:53.916] break [15:31:53.916] } [15:31:53.916] } [15:31:53.916] } [15:31:53.916] invisible(muffled) [15:31:53.916] } [15:31:53.916] muffleCondition(cond, pattern = "^muffle") [15:31:53.916] } [15:31:53.916] } [15:31:53.916] else { [15:31:53.916] if (TRUE) { [15:31:53.916] muffleCondition <- function (cond, pattern = "^muffle") [15:31:53.916] { [15:31:53.916] inherits <- base::inherits [15:31:53.916] invokeRestart <- base::invokeRestart [15:31:53.916] is.null <- base::is.null [15:31:53.916] muffled <- FALSE [15:31:53.916] if (inherits(cond, "message")) { [15:31:53.916] muffled <- grepl(pattern, "muffleMessage") [15:31:53.916] if (muffled) [15:31:53.916] invokeRestart("muffleMessage") [15:31:53.916] } [15:31:53.916] else if (inherits(cond, "warning")) { [15:31:53.916] muffled <- grepl(pattern, "muffleWarning") [15:31:53.916] if (muffled) [15:31:53.916] invokeRestart("muffleWarning") [15:31:53.916] } [15:31:53.916] else if (inherits(cond, "condition")) { [15:31:53.916] if (!is.null(pattern)) { [15:31:53.916] computeRestarts <- base::computeRestarts [15:31:53.916] grepl <- base::grepl [15:31:53.916] restarts <- computeRestarts(cond) [15:31:53.916] for (restart in restarts) { [15:31:53.916] name <- restart$name [15:31:53.916] if (is.null(name)) [15:31:53.916] next [15:31:53.916] if (!grepl(pattern, name)) [15:31:53.916] next [15:31:53.916] invokeRestart(restart) [15:31:53.916] muffled <- TRUE [15:31:53.916] break [15:31:53.916] } [15:31:53.916] } [15:31:53.916] } [15:31:53.916] invisible(muffled) [15:31:53.916] } [15:31:53.916] muffleCondition(cond, pattern = "^muffle") [15:31:53.916] } [15:31:53.916] } [15:31:53.916] } [15:31:53.916] })) [15:31:53.916] }, error = function(ex) { [15:31:53.916] base::structure(base::list(value = NULL, visible = NULL, [15:31:53.916] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:53.916] ...future.rng), started = ...future.startTime, [15:31:53.916] finished = Sys.time(), session_uuid = NA_character_, [15:31:53.916] version = "1.8"), class = "FutureResult") [15:31:53.916] }, finally = { [15:31:53.916] if (!identical(...future.workdir, getwd())) [15:31:53.916] setwd(...future.workdir) [15:31:53.916] { [15:31:53.916] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:53.916] ...future.oldOptions$nwarnings <- NULL [15:31:53.916] } [15:31:53.916] base::options(...future.oldOptions) [15:31:53.916] if (.Platform$OS.type == "windows") { [15:31:53.916] old_names <- names(...future.oldEnvVars) [15:31:53.916] envs <- base::Sys.getenv() [15:31:53.916] names <- names(envs) [15:31:53.916] common <- intersect(names, old_names) [15:31:53.916] added <- setdiff(names, old_names) [15:31:53.916] removed <- setdiff(old_names, names) [15:31:53.916] changed <- common[...future.oldEnvVars[common] != [15:31:53.916] envs[common]] [15:31:53.916] NAMES <- toupper(changed) [15:31:53.916] args <- list() [15:31:53.916] for (kk in seq_along(NAMES)) { [15:31:53.916] name <- changed[[kk]] [15:31:53.916] NAME <- NAMES[[kk]] [15:31:53.916] if (name != NAME && is.element(NAME, old_names)) [15:31:53.916] next [15:31:53.916] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:53.916] } [15:31:53.916] NAMES <- toupper(added) [15:31:53.916] for (kk in seq_along(NAMES)) { [15:31:53.916] name <- added[[kk]] [15:31:53.916] NAME <- NAMES[[kk]] [15:31:53.916] if (name != NAME && is.element(NAME, old_names)) [15:31:53.916] next [15:31:53.916] args[[name]] <- "" [15:31:53.916] } [15:31:53.916] NAMES <- toupper(removed) [15:31:53.916] for (kk in seq_along(NAMES)) { [15:31:53.916] name <- removed[[kk]] [15:31:53.916] NAME <- NAMES[[kk]] [15:31:53.916] if (name != NAME && is.element(NAME, old_names)) [15:31:53.916] next [15:31:53.916] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:53.916] } [15:31:53.916] if (length(args) > 0) [15:31:53.916] base::do.call(base::Sys.setenv, args = args) [15:31:53.916] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:53.916] } [15:31:53.916] else { [15:31:53.916] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:53.916] } [15:31:53.916] { [15:31:53.916] if (base::length(...future.futureOptionsAdded) > [15:31:53.916] 0L) { [15:31:53.916] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:53.916] base::names(opts) <- ...future.futureOptionsAdded [15:31:53.916] base::options(opts) [15:31:53.916] } [15:31:53.916] { [15:31:53.916] { [15:31:53.916] NULL [15:31:53.916] RNGkind("Mersenne-Twister") [15:31:53.916] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:53.916] inherits = FALSE) [15:31:53.916] } [15:31:53.916] options(future.plan = NULL) [15:31:53.916] if (is.na(NA_character_)) [15:31:53.916] Sys.unsetenv("R_FUTURE_PLAN") [15:31:53.916] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:53.916] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:53.916] .init = FALSE) [15:31:53.916] } [15:31:53.916] } [15:31:53.916] } [15:31:53.916] }) [15:31:53.916] if (TRUE) { [15:31:53.916] base::sink(type = "output", split = FALSE) [15:31:53.916] if (TRUE) { [15:31:53.916] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:53.916] } [15:31:53.916] else { [15:31:53.916] ...future.result["stdout"] <- base::list(NULL) [15:31:53.916] } [15:31:53.916] base::close(...future.stdout) [15:31:53.916] ...future.stdout <- NULL [15:31:53.916] } [15:31:53.916] ...future.result$conditions <- ...future.conditions [15:31:53.916] ...future.result$finished <- base::Sys.time() [15:31:53.916] ...future.result [15:31:53.916] } [15:31:53.923] assign_globals() ... [15:31:53.923] List of 6 [15:31:53.923] $ ...future.FUN :function (z) [15:31:53.923] $ a : num 3.14 [15:31:53.923] $ future.call.arguments : list() [15:31:53.923] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:53.923] $ ...future.elements_ii :List of 10000 [15:31:53.923] ..$ : int 1 [15:31:53.923] ..$ : int 2 [15:31:53.923] ..$ : int 3 [15:31:53.923] ..$ : int 4 [15:31:53.923] ..$ : int 5 [15:31:53.923] ..$ : int 6 [15:31:53.923] ..$ : int 7 [15:31:53.923] ..$ : int 8 [15:31:53.923] ..$ : int 9 [15:31:53.923] ..$ : int 10 [15:31:53.923] ..$ : int 11 [15:31:53.923] ..$ : int 12 [15:31:53.923] ..$ : int 13 [15:31:53.923] ..$ : int 14 [15:31:53.923] ..$ : int 15 [15:31:53.923] ..$ : int 16 [15:31:53.923] ..$ : int 17 [15:31:53.923] ..$ : int 18 [15:31:53.923] ..$ : int 19 [15:31:53.923] ..$ : int 20 [15:31:53.923] ..$ : int 21 [15:31:53.923] ..$ : int 22 [15:31:53.923] ..$ : int 23 [15:31:53.923] ..$ : int 24 [15:31:53.923] ..$ : int 25 [15:31:53.923] ..$ : int 26 [15:31:53.923] ..$ : int 27 [15:31:53.923] ..$ : int 28 [15:31:53.923] ..$ : int 29 [15:31:53.923] ..$ : int 30 [15:31:53.923] ..$ : int 31 [15:31:53.923] ..$ : int 32 [15:31:53.923] ..$ : int 33 [15:31:53.923] ..$ : int 34 [15:31:53.923] ..$ : int 35 [15:31:53.923] ..$ : int 36 [15:31:53.923] ..$ : int 37 [15:31:53.923] ..$ : int 38 [15:31:53.923] ..$ : int 39 [15:31:53.923] ..$ : int 40 [15:31:53.923] ..$ : int 41 [15:31:53.923] ..$ : int 42 [15:31:53.923] ..$ : int 43 [15:31:53.923] ..$ : int 44 [15:31:53.923] ..$ : int 45 [15:31:53.923] ..$ : int 46 [15:31:53.923] ..$ : int 47 [15:31:53.923] ..$ : int 48 [15:31:53.923] ..$ : int 49 [15:31:53.923] ..$ : int 50 [15:31:53.923] ..$ : int 51 [15:31:53.923] ..$ : int 52 [15:31:53.923] ..$ : int 53 [15:31:53.923] ..$ : int 54 [15:31:53.923] ..$ : int 55 [15:31:53.923] ..$ : int 56 [15:31:53.923] ..$ : int 57 [15:31:53.923] ..$ : int 58 [15:31:53.923] ..$ : int 59 [15:31:53.923] ..$ : int 60 [15:31:53.923] ..$ : int 61 [15:31:53.923] ..$ : int 62 [15:31:53.923] ..$ : int 63 [15:31:53.923] ..$ : int 64 [15:31:53.923] ..$ : int 65 [15:31:53.923] ..$ : int 66 [15:31:53.923] ..$ : int 67 [15:31:53.923] ..$ : int 68 [15:31:53.923] ..$ : int 69 [15:31:53.923] ..$ : int 70 [15:31:53.923] ..$ : int 71 [15:31:53.923] ..$ : int 72 [15:31:53.923] ..$ : int 73 [15:31:53.923] ..$ : int 74 [15:31:53.923] ..$ : int 75 [15:31:53.923] ..$ : int 76 [15:31:53.923] ..$ : int 77 [15:31:53.923] ..$ : int 78 [15:31:53.923] ..$ : int 79 [15:31:53.923] ..$ : int 80 [15:31:53.923] ..$ : int 81 [15:31:53.923] ..$ : int 82 [15:31:53.923] ..$ : int 83 [15:31:53.923] ..$ : int 84 [15:31:53.923] ..$ : int 85 [15:31:53.923] ..$ : int 86 [15:31:53.923] ..$ : int 87 [15:31:53.923] ..$ : int 88 [15:31:53.923] ..$ : int 89 [15:31:53.923] ..$ : int 90 [15:31:53.923] ..$ : int 91 [15:31:53.923] ..$ : int 92 [15:31:53.923] ..$ : int 93 [15:31:53.923] ..$ : int 94 [15:31:53.923] ..$ : int 95 [15:31:53.923] ..$ : int 96 [15:31:53.923] ..$ : int 97 [15:31:53.923] ..$ : int 98 [15:31:53.923] ..$ : int 99 [15:31:53.923] .. [list output truncated] [15:31:53.923] $ ...future.seeds_ii : NULL [15:31:53.923] $ ...future.globals.maxSize: NULL [15:31:53.923] - attr(*, "where")=List of 6 [15:31:53.923] ..$ ...future.FUN : [15:31:53.923] ..$ a : [15:31:53.923] ..$ future.call.arguments : [15:31:53.923] ..$ ...future.elements_ii : [15:31:53.923] ..$ ...future.seeds_ii : [15:31:53.923] ..$ ...future.globals.maxSize: [15:31:53.923] - attr(*, "resolved")= logi FALSE [15:31:53.923] - attr(*, "total_size")= num 1976 [15:31:53.923] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:53.923] - attr(*, "already-done")= logi TRUE [15:31:53.992] - reassign environment for '...future.FUN' [15:31:53.993] - copied '...future.FUN' to environment [15:31:53.993] - copied 'a' to environment [15:31:53.993] - copied 'future.call.arguments' to environment [15:31:53.993] - copied '...future.elements_ii' to environment [15:31:53.993] - copied '...future.seeds_ii' to environment [15:31:53.993] - copied '...future.globals.maxSize' to environment [15:31:53.994] assign_globals() ... done [15:31:53.994] plan(): Setting new future strategy stack: [15:31:53.994] List of future strategies: [15:31:53.994] 1. sequential: [15:31:53.994] - args: function (..., envir = parent.frame(), workers = "") [15:31:53.994] - tweaked: FALSE [15:31:53.994] - call: NULL [15:31:53.995] plan(): nbrOfWorkers() = 1 [15:31:54.022] plan(): Setting new future strategy stack: [15:31:54.022] List of future strategies: [15:31:54.022] 1. sequential: [15:31:54.022] - args: function (..., envir = parent.frame(), workers = "") [15:31:54.022] - tweaked: FALSE [15:31:54.022] - call: plan(strategy) [15:31:54.023] plan(): nbrOfWorkers() = 1 [15:31:54.023] SequentialFuture started (and completed) [15:31:54.023] - Launch lazy future ... done [15:31:54.023] run() for 'SequentialFuture' ... done [15:31:54.024] Created future: [15:31:54.024] SequentialFuture: [15:31:54.024] Label: 'future_lapply-1' [15:31:54.024] Expression: [15:31:54.024] { [15:31:54.024] do.call(function(...) { [15:31:54.024] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:54.024] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:54.024] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:54.024] on.exit(options(oopts), add = TRUE) [15:31:54.024] } [15:31:54.024] { [15:31:54.024] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:54.024] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:54.024] ...future.FUN(...future.X_jj, ...) [15:31:54.024] }) [15:31:54.024] } [15:31:54.024] }, args = future.call.arguments) [15:31:54.024] } [15:31:54.024] Lazy evaluation: FALSE [15:31:54.024] Asynchronous evaluation: FALSE [15:31:54.024] Local evaluation: TRUE [15:31:54.024] Environment: R_GlobalEnv [15:31:54.024] Capture standard output: TRUE [15:31:54.024] Capture condition classes: 'condition' (excluding 'nothing') [15:31:54.024] Globals: 6 objects totaling 548.80 KiB (function '...future.FUN' of 1.88 KiB, numeric 'a' of 56 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 546.88 KiB, NULL '...future.seeds_ii' of 0 bytes, ...) [15:31:54.024] Packages: [15:31:54.024] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:54.024] Resolved: TRUE [15:31:54.024] Value: 546.88 KiB of class 'list' [15:31:54.024] Early signaling: FALSE [15:31:54.024] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:54.024] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:54.201] Chunk #1 of 1 ... DONE [15:31:54.202] Launching 1 futures (chunks) ... DONE [15:31:54.202] Resolving 1 futures (chunks) ... [15:31:54.202] resolve() on list ... [15:31:54.203] recursive: 0 [15:31:54.203] length: 1 [15:31:54.203] [15:31:54.203] resolved() for 'SequentialFuture' ... [15:31:54.204] - state: 'finished' [15:31:54.204] - run: TRUE [15:31:54.204] - result: 'FutureResult' [15:31:54.204] resolved() for 'SequentialFuture' ... done [15:31:54.205] Future #1 [15:31:54.205] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:54.205] - nx: 1 [15:31:54.206] - relay: TRUE [15:31:54.206] - stdout: TRUE [15:31:54.206] - signal: TRUE [15:31:54.206] - resignal: FALSE [15:31:54.207] - force: TRUE [15:31:54.207] - relayed: [n=1] FALSE [15:31:54.207] - queued futures: [n=1] FALSE [15:31:54.207] - until=1 [15:31:54.208] - relaying element #1 [15:31:54.208] - relayed: [n=1] TRUE [15:31:54.208] - queued futures: [n=1] TRUE [15:31:54.209] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:54.209] length: 0 (resolved future 1) [15:31:54.209] Relaying remaining futures [15:31:54.209] signalConditionsASAP(NULL, pos=0) ... [15:31:54.210] - nx: 1 [15:31:54.210] - relay: TRUE [15:31:54.210] - stdout: TRUE [15:31:54.210] - signal: TRUE [15:31:54.211] - resignal: FALSE [15:31:54.211] - force: TRUE [15:31:54.211] - relayed: [n=1] TRUE [15:31:54.211] - queued futures: [n=1] TRUE - flush all [15:31:54.212] - relayed: [n=1] TRUE [15:31:54.212] - queued futures: [n=1] TRUE [15:31:54.212] signalConditionsASAP(NULL, pos=0) ... done [15:31:54.213] resolve() on list ... DONE [15:31:54.213] - Number of value chunks collected: 1 [15:31:54.213] Resolving 1 futures (chunks) ... DONE [15:31:54.214] Reducing values from 1 chunks ... [15:31:54.214] - Number of values collected after concatenation: 10000 [15:31:54.214] - Number of values expected: 10000 [15:31:54.215] Reducing values from 1 chunks ... DONE [15:31:54.215] future_lapply() ... DONE - future_lapply(x, FUN = table, ...) ... [15:31:54.217] future_lapply() ... [15:31:54.294] Number of chunks: 1 [15:31:54.294] getGlobalsAndPackagesXApply() ... [15:31:54.294] - future.globals: TRUE [15:31:54.295] getGlobalsAndPackages() ... [15:31:54.295] Searching for globals... [15:31:54.370] - 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<-' [15:31:54.371] Searching for globals ... DONE [15:31:54.371] Resolving globals: FALSE [15:31:54.374] The total size of the 1 globals is 345.92 KiB (354224 bytes) [15:31:54.375] The total size of the 1 globals exported for future expression ('FUN()') is 345.92 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (345.92 KiB of class 'function') [15:31:54.375] - globals: [1] 'FUN' [15:31:54.376] [15:31:54.376] getGlobalsAndPackages() ... DONE [15:31:54.376] - globals found/used: [n=1] 'FUN' [15:31:54.377] - needed namespaces: [n=0] [15:31:54.377] Finding globals ... DONE [15:31:54.377] - use_args: TRUE [15:31:54.377] - Getting '...' globals ... [15:31:54.378] resolve() on list ... [15:31:54.378] recursive: 0 [15:31:54.379] length: 1 [15:31:54.379] elements: '...' [15:31:54.379] length: 0 (resolved future 1) [15:31:54.379] resolve() on list ... DONE [15:31:54.380] - '...' content: [n=0] [15:31:54.380] List of 1 [15:31:54.380] $ ...: list() [15:31:54.380] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:54.380] - attr(*, "where")=List of 1 [15:31:54.380] ..$ ...: [15:31:54.380] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:54.380] - attr(*, "resolved")= logi TRUE [15:31:54.380] - attr(*, "total_size")= num NA [15:31:54.389] - Getting '...' globals ... DONE [15:31:54.390] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:54.390] List of 2 [15:31:54.390] $ ...future.FUN:function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [15:31:54.390] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [15:31:54.390] $ ... : list() [15:31:54.390] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:54.390] - attr(*, "where")=List of 2 [15:31:54.390] ..$ ...future.FUN: [15:31:54.390] ..$ ... : [15:31:54.390] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:54.390] - attr(*, "resolved")= logi FALSE [15:31:54.390] - attr(*, "total_size")= num 354224 [15:31:54.396] Packages to be attached in all futures: [n=0] [15:31:54.396] getGlobalsAndPackagesXApply() ... DONE [15:31:54.397] Number of futures (= number of chunks): 1 [15:31:54.397] Launching 1 futures (chunks) ... [15:31:54.397] Chunk #1 of 1 ... [15:31:54.398] - Finding globals in 'X' for chunk #1 ... [15:31:54.398] getGlobalsAndPackages() ... [15:31:54.398] Searching for globals... [15:31:54.399] [15:31:54.399] Searching for globals ... DONE [15:31:54.399] - globals: [0] [15:31:54.399] getGlobalsAndPackages() ... DONE [15:31:54.400] + additional globals found: [n=0] [15:31:54.400] + additional namespaces needed: [n=0] [15:31:54.400] - Finding globals in 'X' for chunk #1 ... DONE [15:31:54.401] - seeds: [15:31:54.401] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:54.401] getGlobalsAndPackages() ... [15:31:54.401] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:54.402] Resolving globals: FALSE [15:31:54.402] Tweak future expression to call with '...' arguments ... [15:31:54.402] { [15:31:54.402] do.call(function(...) { [15:31:54.402] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:54.402] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:54.402] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:54.402] on.exit(options(oopts), add = TRUE) [15:31:54.402] } [15:31:54.402] { [15:31:54.402] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:54.402] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:54.402] ...future.FUN(...future.X_jj, ...) [15:31:54.402] }) [15:31:54.402] } [15:31:54.402] }, args = future.call.arguments) [15:31:54.402] } [15:31:54.403] Tweak future expression to call with '...' arguments ... DONE [15:31:54.404] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:54.404] [15:31:54.404] getGlobalsAndPackages() ... DONE [15:31:54.405] run() for 'Future' ... [15:31:54.405] - state: 'created' [15:31:54.406] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:54.406] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:54.407] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:54.407] - Field: 'label' [15:31:54.407] - Field: 'local' [15:31:54.407] - Field: 'owner' [15:31:54.408] - Field: 'envir' [15:31:54.408] - Field: 'packages' [15:31:54.408] - Field: 'gc' [15:31:54.408] - Field: 'conditions' [15:31:54.409] - Field: 'expr' [15:31:54.409] - Field: 'uuid' [15:31:54.409] - Field: 'seed' [15:31:54.410] - Field: 'version' [15:31:54.410] - Field: 'result' [15:31:54.410] - Field: 'asynchronous' [15:31:54.410] - Field: 'calls' [15:31:54.411] - Field: 'globals' [15:31:54.411] - Field: 'stdout' [15:31:54.411] - Field: 'earlySignal' [15:31:54.411] - Field: 'lazy' [15:31:54.412] - Field: 'state' [15:31:54.412] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:54.412] - Launch lazy future ... [15:31:54.413] Packages needed by the future expression (n = 0): [15:31:54.413] Packages needed by future strategies (n = 0): [15:31:54.414] { [15:31:54.414] { [15:31:54.414] { [15:31:54.414] ...future.startTime <- base::Sys.time() [15:31:54.414] { [15:31:54.414] { [15:31:54.414] { [15:31:54.414] base::local({ [15:31:54.414] has_future <- base::requireNamespace("future", [15:31:54.414] quietly = TRUE) [15:31:54.414] if (has_future) { [15:31:54.414] ns <- base::getNamespace("future") [15:31:54.414] version <- ns[[".package"]][["version"]] [15:31:54.414] if (is.null(version)) [15:31:54.414] version <- utils::packageVersion("future") [15:31:54.414] } [15:31:54.414] else { [15:31:54.414] version <- NULL [15:31:54.414] } [15:31:54.414] if (!has_future || version < "1.8.0") { [15:31:54.414] info <- base::c(r_version = base::gsub("R version ", [15:31:54.414] "", base::R.version$version.string), [15:31:54.414] platform = base::sprintf("%s (%s-bit)", [15:31:54.414] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:54.414] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:54.414] "release", "version")], collapse = " "), [15:31:54.414] hostname = base::Sys.info()[["nodename"]]) [15:31:54.414] info <- base::sprintf("%s: %s", base::names(info), [15:31:54.414] info) [15:31:54.414] info <- base::paste(info, collapse = "; ") [15:31:54.414] if (!has_future) { [15:31:54.414] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:54.414] info) [15:31:54.414] } [15:31:54.414] else { [15:31:54.414] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:54.414] info, version) [15:31:54.414] } [15:31:54.414] base::stop(msg) [15:31:54.414] } [15:31:54.414] }) [15:31:54.414] } [15:31:54.414] ...future.strategy.old <- future::plan("list") [15:31:54.414] options(future.plan = NULL) [15:31:54.414] Sys.unsetenv("R_FUTURE_PLAN") [15:31:54.414] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:54.414] } [15:31:54.414] ...future.workdir <- getwd() [15:31:54.414] } [15:31:54.414] ...future.oldOptions <- base::as.list(base::.Options) [15:31:54.414] ...future.oldEnvVars <- base::Sys.getenv() [15:31:54.414] } [15:31:54.414] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:54.414] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:54.414] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:54.414] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:54.414] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:54.414] future.stdout.windows.reencode = NULL, width = 80L) [15:31:54.414] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:54.414] base::names(...future.oldOptions)) [15:31:54.414] } [15:31:54.414] if (FALSE) { [15:31:54.414] } [15:31:54.414] else { [15:31:54.414] if (TRUE) { [15:31:54.414] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:54.414] open = "w") [15:31:54.414] } [15:31:54.414] else { [15:31:54.414] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:54.414] windows = "NUL", "/dev/null"), open = "w") [15:31:54.414] } [15:31:54.414] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:54.414] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:54.414] base::sink(type = "output", split = FALSE) [15:31:54.414] base::close(...future.stdout) [15:31:54.414] }, add = TRUE) [15:31:54.414] } [15:31:54.414] ...future.frame <- base::sys.nframe() [15:31:54.414] ...future.conditions <- base::list() [15:31:54.414] ...future.rng <- base::globalenv()$.Random.seed [15:31:54.414] if (FALSE) { [15:31:54.414] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:54.414] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:54.414] } [15:31:54.414] ...future.result <- base::tryCatch({ [15:31:54.414] base::withCallingHandlers({ [15:31:54.414] ...future.value <- base::withVisible(base::local({ [15:31:54.414] do.call(function(...) { [15:31:54.414] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:54.414] if (!identical(...future.globals.maxSize.org, [15:31:54.414] ...future.globals.maxSize)) { [15:31:54.414] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:54.414] on.exit(options(oopts), add = TRUE) [15:31:54.414] } [15:31:54.414] { [15:31:54.414] lapply(seq_along(...future.elements_ii), [15:31:54.414] FUN = function(jj) { [15:31:54.414] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:54.414] ...future.FUN(...future.X_jj, ...) [15:31:54.414] }) [15:31:54.414] } [15:31:54.414] }, args = future.call.arguments) [15:31:54.414] })) [15:31:54.414] future::FutureResult(value = ...future.value$value, [15:31:54.414] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:54.414] ...future.rng), globalenv = if (FALSE) [15:31:54.414] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:54.414] ...future.globalenv.names)) [15:31:54.414] else NULL, started = ...future.startTime, version = "1.8") [15:31:54.414] }, condition = base::local({ [15:31:54.414] c <- base::c [15:31:54.414] inherits <- base::inherits [15:31:54.414] invokeRestart <- base::invokeRestart [15:31:54.414] length <- base::length [15:31:54.414] list <- base::list [15:31:54.414] seq.int <- base::seq.int [15:31:54.414] signalCondition <- base::signalCondition [15:31:54.414] sys.calls <- base::sys.calls [15:31:54.414] `[[` <- base::`[[` [15:31:54.414] `+` <- base::`+` [15:31:54.414] `<<-` <- base::`<<-` [15:31:54.414] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:54.414] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:54.414] 3L)] [15:31:54.414] } [15:31:54.414] function(cond) { [15:31:54.414] is_error <- inherits(cond, "error") [15:31:54.414] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:54.414] NULL) [15:31:54.414] if (is_error) { [15:31:54.414] sessionInformation <- function() { [15:31:54.414] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:54.414] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:54.414] search = base::search(), system = base::Sys.info()) [15:31:54.414] } [15:31:54.414] ...future.conditions[[length(...future.conditions) + [15:31:54.414] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:54.414] cond$call), session = sessionInformation(), [15:31:54.414] timestamp = base::Sys.time(), signaled = 0L) [15:31:54.414] signalCondition(cond) [15:31:54.414] } [15:31:54.414] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:54.414] "immediateCondition"))) { [15:31:54.414] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:54.414] ...future.conditions[[length(...future.conditions) + [15:31:54.414] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:54.414] if (TRUE && !signal) { [15:31:54.414] muffleCondition <- function (cond, pattern = "^muffle") [15:31:54.414] { [15:31:54.414] inherits <- base::inherits [15:31:54.414] invokeRestart <- base::invokeRestart [15:31:54.414] is.null <- base::is.null [15:31:54.414] muffled <- FALSE [15:31:54.414] if (inherits(cond, "message")) { [15:31:54.414] muffled <- grepl(pattern, "muffleMessage") [15:31:54.414] if (muffled) [15:31:54.414] invokeRestart("muffleMessage") [15:31:54.414] } [15:31:54.414] else if (inherits(cond, "warning")) { [15:31:54.414] muffled <- grepl(pattern, "muffleWarning") [15:31:54.414] if (muffled) [15:31:54.414] invokeRestart("muffleWarning") [15:31:54.414] } [15:31:54.414] else if (inherits(cond, "condition")) { [15:31:54.414] if (!is.null(pattern)) { [15:31:54.414] computeRestarts <- base::computeRestarts [15:31:54.414] grepl <- base::grepl [15:31:54.414] restarts <- computeRestarts(cond) [15:31:54.414] for (restart in restarts) { [15:31:54.414] name <- restart$name [15:31:54.414] if (is.null(name)) [15:31:54.414] next [15:31:54.414] if (!grepl(pattern, name)) [15:31:54.414] next [15:31:54.414] invokeRestart(restart) [15:31:54.414] muffled <- TRUE [15:31:54.414] break [15:31:54.414] } [15:31:54.414] } [15:31:54.414] } [15:31:54.414] invisible(muffled) [15:31:54.414] } [15:31:54.414] muffleCondition(cond, pattern = "^muffle") [15:31:54.414] } [15:31:54.414] } [15:31:54.414] else { [15:31:54.414] if (TRUE) { [15:31:54.414] muffleCondition <- function (cond, pattern = "^muffle") [15:31:54.414] { [15:31:54.414] inherits <- base::inherits [15:31:54.414] invokeRestart <- base::invokeRestart [15:31:54.414] is.null <- base::is.null [15:31:54.414] muffled <- FALSE [15:31:54.414] if (inherits(cond, "message")) { [15:31:54.414] muffled <- grepl(pattern, "muffleMessage") [15:31:54.414] if (muffled) [15:31:54.414] invokeRestart("muffleMessage") [15:31:54.414] } [15:31:54.414] else if (inherits(cond, "warning")) { [15:31:54.414] muffled <- grepl(pattern, "muffleWarning") [15:31:54.414] if (muffled) [15:31:54.414] invokeRestart("muffleWarning") [15:31:54.414] } [15:31:54.414] else if (inherits(cond, "condition")) { [15:31:54.414] if (!is.null(pattern)) { [15:31:54.414] computeRestarts <- base::computeRestarts [15:31:54.414] grepl <- base::grepl [15:31:54.414] restarts <- computeRestarts(cond) [15:31:54.414] for (restart in restarts) { [15:31:54.414] name <- restart$name [15:31:54.414] if (is.null(name)) [15:31:54.414] next [15:31:54.414] if (!grepl(pattern, name)) [15:31:54.414] next [15:31:54.414] invokeRestart(restart) [15:31:54.414] muffled <- TRUE [15:31:54.414] break [15:31:54.414] } [15:31:54.414] } [15:31:54.414] } [15:31:54.414] invisible(muffled) [15:31:54.414] } [15:31:54.414] muffleCondition(cond, pattern = "^muffle") [15:31:54.414] } [15:31:54.414] } [15:31:54.414] } [15:31:54.414] })) [15:31:54.414] }, error = function(ex) { [15:31:54.414] base::structure(base::list(value = NULL, visible = NULL, [15:31:54.414] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:54.414] ...future.rng), started = ...future.startTime, [15:31:54.414] finished = Sys.time(), session_uuid = NA_character_, [15:31:54.414] version = "1.8"), class = "FutureResult") [15:31:54.414] }, finally = { [15:31:54.414] if (!identical(...future.workdir, getwd())) [15:31:54.414] setwd(...future.workdir) [15:31:54.414] { [15:31:54.414] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:54.414] ...future.oldOptions$nwarnings <- NULL [15:31:54.414] } [15:31:54.414] base::options(...future.oldOptions) [15:31:54.414] if (.Platform$OS.type == "windows") { [15:31:54.414] old_names <- names(...future.oldEnvVars) [15:31:54.414] envs <- base::Sys.getenv() [15:31:54.414] names <- names(envs) [15:31:54.414] common <- intersect(names, old_names) [15:31:54.414] added <- setdiff(names, old_names) [15:31:54.414] removed <- setdiff(old_names, names) [15:31:54.414] changed <- common[...future.oldEnvVars[common] != [15:31:54.414] envs[common]] [15:31:54.414] NAMES <- toupper(changed) [15:31:54.414] args <- list() [15:31:54.414] for (kk in seq_along(NAMES)) { [15:31:54.414] name <- changed[[kk]] [15:31:54.414] NAME <- NAMES[[kk]] [15:31:54.414] if (name != NAME && is.element(NAME, old_names)) [15:31:54.414] next [15:31:54.414] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:54.414] } [15:31:54.414] NAMES <- toupper(added) [15:31:54.414] for (kk in seq_along(NAMES)) { [15:31:54.414] name <- added[[kk]] [15:31:54.414] NAME <- NAMES[[kk]] [15:31:54.414] if (name != NAME && is.element(NAME, old_names)) [15:31:54.414] next [15:31:54.414] args[[name]] <- "" [15:31:54.414] } [15:31:54.414] NAMES <- toupper(removed) [15:31:54.414] for (kk in seq_along(NAMES)) { [15:31:54.414] name <- removed[[kk]] [15:31:54.414] NAME <- NAMES[[kk]] [15:31:54.414] if (name != NAME && is.element(NAME, old_names)) [15:31:54.414] next [15:31:54.414] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:54.414] } [15:31:54.414] if (length(args) > 0) [15:31:54.414] base::do.call(base::Sys.setenv, args = args) [15:31:54.414] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:54.414] } [15:31:54.414] else { [15:31:54.414] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:54.414] } [15:31:54.414] { [15:31:54.414] if (base::length(...future.futureOptionsAdded) > [15:31:54.414] 0L) { [15:31:54.414] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:54.414] base::names(opts) <- ...future.futureOptionsAdded [15:31:54.414] base::options(opts) [15:31:54.414] } [15:31:54.414] { [15:31:54.414] { [15:31:54.414] NULL [15:31:54.414] RNGkind("Mersenne-Twister") [15:31:54.414] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:54.414] inherits = FALSE) [15:31:54.414] } [15:31:54.414] options(future.plan = NULL) [15:31:54.414] if (is.na(NA_character_)) [15:31:54.414] Sys.unsetenv("R_FUTURE_PLAN") [15:31:54.414] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:54.414] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:54.414] .init = FALSE) [15:31:54.414] } [15:31:54.414] } [15:31:54.414] } [15:31:54.414] }) [15:31:54.414] if (TRUE) { [15:31:54.414] base::sink(type = "output", split = FALSE) [15:31:54.414] if (TRUE) { [15:31:54.414] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:54.414] } [15:31:54.414] else { [15:31:54.414] ...future.result["stdout"] <- base::list(NULL) [15:31:54.414] } [15:31:54.414] base::close(...future.stdout) [15:31:54.414] ...future.stdout <- NULL [15:31:54.414] } [15:31:54.414] ...future.result$conditions <- ...future.conditions [15:31:54.414] ...future.result$finished <- base::Sys.time() [15:31:54.414] ...future.result [15:31:54.414] } [15:31:54.420] assign_globals() ... [15:31:54.420] List of 5 [15:31:54.420] $ ...future.FUN :function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [15:31:54.420] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [15:31:54.420] $ future.call.arguments : list() [15:31:54.420] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:54.420] $ ...future.elements_ii :List of 2 [15:31:54.420] ..$ a: int [1:4] 1 2 3 4 [15:31:54.420] ..$ b: int [1:4] 5 6 7 8 [15:31:54.420] $ ...future.seeds_ii : NULL [15:31:54.420] $ ...future.globals.maxSize: NULL [15:31:54.420] - attr(*, "where")=List of 5 [15:31:54.420] ..$ ...future.FUN : [15:31:54.420] ..$ future.call.arguments : [15:31:54.420] ..$ ...future.elements_ii : [15:31:54.420] ..$ ...future.seeds_ii : [15:31:54.420] ..$ ...future.globals.maxSize: [15:31:54.420] - attr(*, "resolved")= logi FALSE [15:31:54.420] - attr(*, "total_size")= num 354224 [15:31:54.420] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:54.420] - attr(*, "already-done")= logi TRUE [15:31:54.429] - copied '...future.FUN' to environment [15:31:54.429] - copied 'future.call.arguments' to environment [15:31:54.429] - copied '...future.elements_ii' to environment [15:31:54.430] - copied '...future.seeds_ii' to environment [15:31:54.430] - copied '...future.globals.maxSize' to environment [15:31:54.430] assign_globals() ... done [15:31:54.431] plan(): Setting new future strategy stack: [15:31:54.431] List of future strategies: [15:31:54.431] 1. sequential: [15:31:54.431] - args: function (..., envir = parent.frame(), workers = "") [15:31:54.431] - tweaked: FALSE [15:31:54.431] - call: NULL [15:31:54.432] plan(): nbrOfWorkers() = 1 [15:31:54.434] plan(): Setting new future strategy stack: [15:31:54.434] List of future strategies: [15:31:54.434] 1. sequential: [15:31:54.434] - args: function (..., envir = parent.frame(), workers = "") [15:31:54.434] - tweaked: FALSE [15:31:54.434] - call: plan(strategy) [15:31:54.435] plan(): nbrOfWorkers() = 1 [15:31:54.436] SequentialFuture started (and completed) [15:31:54.436] - Launch lazy future ... done [15:31:54.436] run() for 'SequentialFuture' ... done [15:31:54.436] Created future: [15:31:54.437] SequentialFuture: [15:31:54.437] Label: 'future_lapply-1' [15:31:54.437] Expression: [15:31:54.437] { [15:31:54.437] do.call(function(...) { [15:31:54.437] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:54.437] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:54.437] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:54.437] on.exit(options(oopts), add = TRUE) [15:31:54.437] } [15:31:54.437] { [15:31:54.437] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:54.437] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:54.437] ...future.FUN(...future.X_jj, ...) [15:31:54.437] }) [15:31:54.437] } [15:31:54.437] }, args = future.call.arguments) [15:31:54.437] } [15:31:54.437] Lazy evaluation: FALSE [15:31:54.437] Asynchronous evaluation: FALSE [15:31:54.437] Local evaluation: TRUE [15:31:54.437] Environment: R_GlobalEnv [15:31:54.437] Capture standard output: TRUE [15:31:54.437] Capture condition classes: 'condition' (excluding 'nothing') [15:31:54.437] Globals: 5 objects totaling 346.05 KiB (function '...future.FUN' of 345.92 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 128 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:54.437] Packages: [15:31:54.437] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:54.437] Resolved: TRUE [15:31:54.437] Value: 2.27 KiB of class 'list' [15:31:54.437] Early signaling: FALSE [15:31:54.437] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:54.437] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:54.439] Chunk #1 of 1 ... DONE [15:31:54.439] Launching 1 futures (chunks) ... DONE [15:31:54.439] Resolving 1 futures (chunks) ... [15:31:54.440] resolve() on list ... [15:31:54.440] recursive: 0 [15:31:54.440] length: 1 [15:31:54.440] [15:31:54.441] resolved() for 'SequentialFuture' ... [15:31:54.441] - state: 'finished' [15:31:54.441] - run: TRUE [15:31:54.441] - result: 'FutureResult' [15:31:54.442] resolved() for 'SequentialFuture' ... done [15:31:54.442] Future #1 [15:31:54.442] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:54.443] - nx: 1 [15:31:54.443] - relay: TRUE [15:31:54.443] - stdout: TRUE [15:31:54.443] - signal: TRUE [15:31:54.443] - resignal: FALSE [15:31:54.444] - force: TRUE [15:31:54.444] - relayed: [n=1] FALSE [15:31:54.444] - queued futures: [n=1] FALSE [15:31:54.444] - until=1 [15:31:54.445] - relaying element #1 [15:31:54.445] - relayed: [n=1] TRUE [15:31:54.445] - queued futures: [n=1] TRUE [15:31:54.446] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:54.446] length: 0 (resolved future 1) [15:31:54.446] Relaying remaining futures [15:31:54.446] signalConditionsASAP(NULL, pos=0) ... [15:31:54.447] - nx: 1 [15:31:54.447] - relay: TRUE [15:31:54.447] - stdout: TRUE [15:31:54.447] - signal: TRUE [15:31:54.447] - resignal: FALSE [15:31:54.448] - force: TRUE [15:31:54.448] - relayed: [n=1] TRUE [15:31:54.448] - queued futures: [n=1] TRUE - flush all [15:31:54.449] - relayed: [n=1] TRUE [15:31:54.449] - queued futures: [n=1] TRUE [15:31:54.449] signalConditionsASAP(NULL, pos=0) ... done [15:31:54.449] resolve() on list ... DONE [15:31:54.450] - Number of value chunks collected: 1 [15:31:54.450] Resolving 1 futures (chunks) ... DONE [15:31:54.450] Reducing values from 1 chunks ... [15:31:54.450] - Number of values collected after concatenation: 2 [15:31:54.451] - Number of values expected: 2 [15:31:54.451] Reducing values from 1 chunks ... DONE [15:31:54.451] future_lapply() ... DONE - future_lapply(x, ...) where length(x) != length(as.list(x)) ... [15:31:54.452] future_lapply() ... [15:31:54.452] Number of chunks: 1 [15:31:54.453] getGlobalsAndPackagesXApply() ... [15:31:54.453] - future.globals: TRUE [15:31:54.453] getGlobalsAndPackages() ... [15:31:54.453] Searching for globals... [15:31:54.455] - globals found: [1] 'FUN' [15:31:54.455] Searching for globals ... DONE [15:31:54.455] Resolving globals: FALSE [15:31:54.456] The total size of the 1 globals is 56 bytes (56 bytes) [15:31:54.456] The total size of the 1 globals exported for future expression ('FUN()') is 56 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (56 bytes of class 'function') [15:31:54.457] - globals: [1] 'FUN' [15:31:54.457] [15:31:54.457] getGlobalsAndPackages() ... DONE [15:31:54.457] - globals found/used: [n=1] 'FUN' [15:31:54.458] - needed namespaces: [n=0] [15:31:54.458] Finding globals ... DONE [15:31:54.458] - use_args: TRUE [15:31:54.459] - Getting '...' globals ... [15:31:54.459] resolve() on list ... [15:31:54.459] recursive: 0 [15:31:54.460] length: 1 [15:31:54.460] elements: '...' [15:31:54.460] length: 0 (resolved future 1) [15:31:54.461] resolve() on list ... DONE [15:31:54.461] - '...' content: [n=0] [15:31:54.461] List of 1 [15:31:54.461] $ ...: list() [15:31:54.461] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:54.461] - attr(*, "where")=List of 1 [15:31:54.461] ..$ ...: [15:31:54.461] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:54.461] - attr(*, "resolved")= logi TRUE [15:31:54.461] - attr(*, "total_size")= num NA [15:31:54.466] - Getting '...' globals ... DONE [15:31:54.466] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:54.466] List of 2 [15:31:54.466] $ ...future.FUN:function (x) [15:31:54.466] $ ... : list() [15:31:54.466] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:54.466] - attr(*, "where")=List of 2 [15:31:54.466] ..$ ...future.FUN: [15:31:54.466] ..$ ... : [15:31:54.466] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:54.466] - attr(*, "resolved")= logi FALSE [15:31:54.466] - attr(*, "total_size")= num 56 [15:31:54.471] Packages to be attached in all futures: [n=0] [15:31:54.472] getGlobalsAndPackagesXApply() ... DONE [15:31:54.472] Number of futures (= number of chunks): 1 [15:31:54.472] Launching 1 futures (chunks) ... [15:31:54.473] Chunk #1 of 1 ... [15:31:54.473] - Finding globals in 'X' for chunk #1 ... [15:31:54.473] getGlobalsAndPackages() ... [15:31:54.473] Searching for globals... [15:31:54.474] [15:31:54.474] Searching for globals ... DONE [15:31:54.474] - globals: [0] [15:31:54.475] getGlobalsAndPackages() ... DONE [15:31:54.475] + additional globals found: [n=0] [15:31:54.475] + additional namespaces needed: [n=0] [15:31:54.475] - Finding globals in 'X' for chunk #1 ... DONE [15:31:54.476] - seeds: [15:31:54.476] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:54.476] getGlobalsAndPackages() ... [15:31:54.476] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:54.477] Resolving globals: FALSE [15:31:54.477] Tweak future expression to call with '...' arguments ... [15:31:54.477] { [15:31:54.477] do.call(function(...) { [15:31:54.477] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:54.477] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:54.477] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:54.477] on.exit(options(oopts), add = TRUE) [15:31:54.477] } [15:31:54.477] { [15:31:54.477] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:54.477] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:54.477] ...future.FUN(...future.X_jj, ...) [15:31:54.477] }) [15:31:54.477] } [15:31:54.477] }, args = future.call.arguments) [15:31:54.477] } [15:31:54.478] Tweak future expression to call with '...' arguments ... DONE [15:31:54.479] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:54.479] [15:31:54.479] getGlobalsAndPackages() ... DONE [15:31:54.480] run() for 'Future' ... [15:31:54.480] - state: 'created' [15:31:54.481] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:54.481] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:54.481] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:54.482] - Field: 'label' [15:31:54.482] - Field: 'local' [15:31:54.482] - Field: 'owner' [15:31:54.483] - Field: 'envir' [15:31:54.483] - Field: 'packages' [15:31:54.483] - Field: 'gc' [15:31:54.484] - Field: 'conditions' [15:31:54.484] - Field: 'expr' [15:31:54.484] - Field: 'uuid' [15:31:54.484] - Field: 'seed' [15:31:54.485] - Field: 'version' [15:31:54.485] - Field: 'result' [15:31:54.485] - Field: 'asynchronous' [15:31:54.486] - Field: 'calls' [15:31:54.486] - Field: 'globals' [15:31:54.486] - Field: 'stdout' [15:31:54.486] - Field: 'earlySignal' [15:31:54.487] - Field: 'lazy' [15:31:54.487] - Field: 'state' [15:31:54.487] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:54.488] - Launch lazy future ... [15:31:54.488] Packages needed by the future expression (n = 0): [15:31:54.488] Packages needed by future strategies (n = 0): [15:31:54.489] { [15:31:54.489] { [15:31:54.489] { [15:31:54.489] ...future.startTime <- base::Sys.time() [15:31:54.489] { [15:31:54.489] { [15:31:54.489] { [15:31:54.489] base::local({ [15:31:54.489] has_future <- base::requireNamespace("future", [15:31:54.489] quietly = TRUE) [15:31:54.489] if (has_future) { [15:31:54.489] ns <- base::getNamespace("future") [15:31:54.489] version <- ns[[".package"]][["version"]] [15:31:54.489] if (is.null(version)) [15:31:54.489] version <- utils::packageVersion("future") [15:31:54.489] } [15:31:54.489] else { [15:31:54.489] version <- NULL [15:31:54.489] } [15:31:54.489] if (!has_future || version < "1.8.0") { [15:31:54.489] info <- base::c(r_version = base::gsub("R version ", [15:31:54.489] "", base::R.version$version.string), [15:31:54.489] platform = base::sprintf("%s (%s-bit)", [15:31:54.489] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:54.489] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:54.489] "release", "version")], collapse = " "), [15:31:54.489] hostname = base::Sys.info()[["nodename"]]) [15:31:54.489] info <- base::sprintf("%s: %s", base::names(info), [15:31:54.489] info) [15:31:54.489] info <- base::paste(info, collapse = "; ") [15:31:54.489] if (!has_future) { [15:31:54.489] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:54.489] info) [15:31:54.489] } [15:31:54.489] else { [15:31:54.489] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:54.489] info, version) [15:31:54.489] } [15:31:54.489] base::stop(msg) [15:31:54.489] } [15:31:54.489] }) [15:31:54.489] } [15:31:54.489] ...future.strategy.old <- future::plan("list") [15:31:54.489] options(future.plan = NULL) [15:31:54.489] Sys.unsetenv("R_FUTURE_PLAN") [15:31:54.489] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:54.489] } [15:31:54.489] ...future.workdir <- getwd() [15:31:54.489] } [15:31:54.489] ...future.oldOptions <- base::as.list(base::.Options) [15:31:54.489] ...future.oldEnvVars <- base::Sys.getenv() [15:31:54.489] } [15:31:54.489] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:54.489] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:54.489] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:54.489] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:54.489] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:54.489] future.stdout.windows.reencode = NULL, width = 80L) [15:31:54.489] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:54.489] base::names(...future.oldOptions)) [15:31:54.489] } [15:31:54.489] if (FALSE) { [15:31:54.489] } [15:31:54.489] else { [15:31:54.489] if (TRUE) { [15:31:54.489] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:54.489] open = "w") [15:31:54.489] } [15:31:54.489] else { [15:31:54.489] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:54.489] windows = "NUL", "/dev/null"), open = "w") [15:31:54.489] } [15:31:54.489] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:54.489] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:54.489] base::sink(type = "output", split = FALSE) [15:31:54.489] base::close(...future.stdout) [15:31:54.489] }, add = TRUE) [15:31:54.489] } [15:31:54.489] ...future.frame <- base::sys.nframe() [15:31:54.489] ...future.conditions <- base::list() [15:31:54.489] ...future.rng <- base::globalenv()$.Random.seed [15:31:54.489] if (FALSE) { [15:31:54.489] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:54.489] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:54.489] } [15:31:54.489] ...future.result <- base::tryCatch({ [15:31:54.489] base::withCallingHandlers({ [15:31:54.489] ...future.value <- base::withVisible(base::local({ [15:31:54.489] do.call(function(...) { [15:31:54.489] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:54.489] if (!identical(...future.globals.maxSize.org, [15:31:54.489] ...future.globals.maxSize)) { [15:31:54.489] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:54.489] on.exit(options(oopts), add = TRUE) [15:31:54.489] } [15:31:54.489] { [15:31:54.489] lapply(seq_along(...future.elements_ii), [15:31:54.489] FUN = function(jj) { [15:31:54.489] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:54.489] ...future.FUN(...future.X_jj, ...) [15:31:54.489] }) [15:31:54.489] } [15:31:54.489] }, args = future.call.arguments) [15:31:54.489] })) [15:31:54.489] future::FutureResult(value = ...future.value$value, [15:31:54.489] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:54.489] ...future.rng), globalenv = if (FALSE) [15:31:54.489] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:54.489] ...future.globalenv.names)) [15:31:54.489] else NULL, started = ...future.startTime, version = "1.8") [15:31:54.489] }, condition = base::local({ [15:31:54.489] c <- base::c [15:31:54.489] inherits <- base::inherits [15:31:54.489] invokeRestart <- base::invokeRestart [15:31:54.489] length <- base::length [15:31:54.489] list <- base::list [15:31:54.489] seq.int <- base::seq.int [15:31:54.489] signalCondition <- base::signalCondition [15:31:54.489] sys.calls <- base::sys.calls [15:31:54.489] `[[` <- base::`[[` [15:31:54.489] `+` <- base::`+` [15:31:54.489] `<<-` <- base::`<<-` [15:31:54.489] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:54.489] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:54.489] 3L)] [15:31:54.489] } [15:31:54.489] function(cond) { [15:31:54.489] is_error <- inherits(cond, "error") [15:31:54.489] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:54.489] NULL) [15:31:54.489] if (is_error) { [15:31:54.489] sessionInformation <- function() { [15:31:54.489] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:54.489] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:54.489] search = base::search(), system = base::Sys.info()) [15:31:54.489] } [15:31:54.489] ...future.conditions[[length(...future.conditions) + [15:31:54.489] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:54.489] cond$call), session = sessionInformation(), [15:31:54.489] timestamp = base::Sys.time(), signaled = 0L) [15:31:54.489] signalCondition(cond) [15:31:54.489] } [15:31:54.489] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:54.489] "immediateCondition"))) { [15:31:54.489] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:54.489] ...future.conditions[[length(...future.conditions) + [15:31:54.489] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:54.489] if (TRUE && !signal) { [15:31:54.489] muffleCondition <- function (cond, pattern = "^muffle") [15:31:54.489] { [15:31:54.489] inherits <- base::inherits [15:31:54.489] invokeRestart <- base::invokeRestart [15:31:54.489] is.null <- base::is.null [15:31:54.489] muffled <- FALSE [15:31:54.489] if (inherits(cond, "message")) { [15:31:54.489] muffled <- grepl(pattern, "muffleMessage") [15:31:54.489] if (muffled) [15:31:54.489] invokeRestart("muffleMessage") [15:31:54.489] } [15:31:54.489] else if (inherits(cond, "warning")) { [15:31:54.489] muffled <- grepl(pattern, "muffleWarning") [15:31:54.489] if (muffled) [15:31:54.489] invokeRestart("muffleWarning") [15:31:54.489] } [15:31:54.489] else if (inherits(cond, "condition")) { [15:31:54.489] if (!is.null(pattern)) { [15:31:54.489] computeRestarts <- base::computeRestarts [15:31:54.489] grepl <- base::grepl [15:31:54.489] restarts <- computeRestarts(cond) [15:31:54.489] for (restart in restarts) { [15:31:54.489] name <- restart$name [15:31:54.489] if (is.null(name)) [15:31:54.489] next [15:31:54.489] if (!grepl(pattern, name)) [15:31:54.489] next [15:31:54.489] invokeRestart(restart) [15:31:54.489] muffled <- TRUE [15:31:54.489] break [15:31:54.489] } [15:31:54.489] } [15:31:54.489] } [15:31:54.489] invisible(muffled) [15:31:54.489] } [15:31:54.489] muffleCondition(cond, pattern = "^muffle") [15:31:54.489] } [15:31:54.489] } [15:31:54.489] else { [15:31:54.489] if (TRUE) { [15:31:54.489] muffleCondition <- function (cond, pattern = "^muffle") [15:31:54.489] { [15:31:54.489] inherits <- base::inherits [15:31:54.489] invokeRestart <- base::invokeRestart [15:31:54.489] is.null <- base::is.null [15:31:54.489] muffled <- FALSE [15:31:54.489] if (inherits(cond, "message")) { [15:31:54.489] muffled <- grepl(pattern, "muffleMessage") [15:31:54.489] if (muffled) [15:31:54.489] invokeRestart("muffleMessage") [15:31:54.489] } [15:31:54.489] else if (inherits(cond, "warning")) { [15:31:54.489] muffled <- grepl(pattern, "muffleWarning") [15:31:54.489] if (muffled) [15:31:54.489] invokeRestart("muffleWarning") [15:31:54.489] } [15:31:54.489] else if (inherits(cond, "condition")) { [15:31:54.489] if (!is.null(pattern)) { [15:31:54.489] computeRestarts <- base::computeRestarts [15:31:54.489] grepl <- base::grepl [15:31:54.489] restarts <- computeRestarts(cond) [15:31:54.489] for (restart in restarts) { [15:31:54.489] name <- restart$name [15:31:54.489] if (is.null(name)) [15:31:54.489] next [15:31:54.489] if (!grepl(pattern, name)) [15:31:54.489] next [15:31:54.489] invokeRestart(restart) [15:31:54.489] muffled <- TRUE [15:31:54.489] break [15:31:54.489] } [15:31:54.489] } [15:31:54.489] } [15:31:54.489] invisible(muffled) [15:31:54.489] } [15:31:54.489] muffleCondition(cond, pattern = "^muffle") [15:31:54.489] } [15:31:54.489] } [15:31:54.489] } [15:31:54.489] })) [15:31:54.489] }, error = function(ex) { [15:31:54.489] base::structure(base::list(value = NULL, visible = NULL, [15:31:54.489] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:54.489] ...future.rng), started = ...future.startTime, [15:31:54.489] finished = Sys.time(), session_uuid = NA_character_, [15:31:54.489] version = "1.8"), class = "FutureResult") [15:31:54.489] }, finally = { [15:31:54.489] if (!identical(...future.workdir, getwd())) [15:31:54.489] setwd(...future.workdir) [15:31:54.489] { [15:31:54.489] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:54.489] ...future.oldOptions$nwarnings <- NULL [15:31:54.489] } [15:31:54.489] base::options(...future.oldOptions) [15:31:54.489] if (.Platform$OS.type == "windows") { [15:31:54.489] old_names <- names(...future.oldEnvVars) [15:31:54.489] envs <- base::Sys.getenv() [15:31:54.489] names <- names(envs) [15:31:54.489] common <- intersect(names, old_names) [15:31:54.489] added <- setdiff(names, old_names) [15:31:54.489] removed <- setdiff(old_names, names) [15:31:54.489] changed <- common[...future.oldEnvVars[common] != [15:31:54.489] envs[common]] [15:31:54.489] NAMES <- toupper(changed) [15:31:54.489] args <- list() [15:31:54.489] for (kk in seq_along(NAMES)) { [15:31:54.489] name <- changed[[kk]] [15:31:54.489] NAME <- NAMES[[kk]] [15:31:54.489] if (name != NAME && is.element(NAME, old_names)) [15:31:54.489] next [15:31:54.489] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:54.489] } [15:31:54.489] NAMES <- toupper(added) [15:31:54.489] for (kk in seq_along(NAMES)) { [15:31:54.489] name <- added[[kk]] [15:31:54.489] NAME <- NAMES[[kk]] [15:31:54.489] if (name != NAME && is.element(NAME, old_names)) [15:31:54.489] next [15:31:54.489] args[[name]] <- "" [15:31:54.489] } [15:31:54.489] NAMES <- toupper(removed) [15:31:54.489] for (kk in seq_along(NAMES)) { [15:31:54.489] name <- removed[[kk]] [15:31:54.489] NAME <- NAMES[[kk]] [15:31:54.489] if (name != NAME && is.element(NAME, old_names)) [15:31:54.489] next [15:31:54.489] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:54.489] } [15:31:54.489] if (length(args) > 0) [15:31:54.489] base::do.call(base::Sys.setenv, args = args) [15:31:54.489] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:54.489] } [15:31:54.489] else { [15:31:54.489] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:54.489] } [15:31:54.489] { [15:31:54.489] if (base::length(...future.futureOptionsAdded) > [15:31:54.489] 0L) { [15:31:54.489] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:54.489] base::names(opts) <- ...future.futureOptionsAdded [15:31:54.489] base::options(opts) [15:31:54.489] } [15:31:54.489] { [15:31:54.489] { [15:31:54.489] NULL [15:31:54.489] RNGkind("Mersenne-Twister") [15:31:54.489] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:54.489] inherits = FALSE) [15:31:54.489] } [15:31:54.489] options(future.plan = NULL) [15:31:54.489] if (is.na(NA_character_)) [15:31:54.489] Sys.unsetenv("R_FUTURE_PLAN") [15:31:54.489] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:54.489] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:54.489] .init = FALSE) [15:31:54.489] } [15:31:54.489] } [15:31:54.489] } [15:31:54.489] }) [15:31:54.489] if (TRUE) { [15:31:54.489] base::sink(type = "output", split = FALSE) [15:31:54.489] if (TRUE) { [15:31:54.489] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:54.489] } [15:31:54.489] else { [15:31:54.489] ...future.result["stdout"] <- base::list(NULL) [15:31:54.489] } [15:31:54.489] base::close(...future.stdout) [15:31:54.489] ...future.stdout <- NULL [15:31:54.489] } [15:31:54.489] ...future.result$conditions <- ...future.conditions [15:31:54.489] ...future.result$finished <- base::Sys.time() [15:31:54.489] ...future.result [15:31:54.489] } [15:31:54.495] assign_globals() ... [15:31:54.495] List of 5 [15:31:54.495] $ ...future.FUN :function (x) [15:31:54.495] $ future.call.arguments : list() [15:31:54.495] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:54.495] $ ...future.elements_ii :List of 3 [15:31:54.495] ..$ a: num 1 [15:31:54.495] ..$ b: num 2 [15:31:54.495] ..$ c: num 3 [15:31:54.495] $ ...future.seeds_ii : NULL [15:31:54.495] $ ...future.globals.maxSize: NULL [15:31:54.495] - attr(*, "where")=List of 5 [15:31:54.495] ..$ ...future.FUN : [15:31:54.495] ..$ future.call.arguments : [15:31:54.495] ..$ ...future.elements_ii : [15:31:54.495] ..$ ...future.seeds_ii : [15:31:54.495] ..$ ...future.globals.maxSize: [15:31:54.495] - attr(*, "resolved")= logi FALSE [15:31:54.495] - attr(*, "total_size")= num 56 [15:31:54.495] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:54.495] - attr(*, "already-done")= logi TRUE [15:31:54.505] - copied '...future.FUN' to environment [15:31:54.505] - copied 'future.call.arguments' to environment [15:31:54.505] - copied '...future.elements_ii' to environment [15:31:54.505] - copied '...future.seeds_ii' to environment [15:31:54.506] - copied '...future.globals.maxSize' to environment [15:31:54.506] assign_globals() ... done [15:31:54.506] plan(): Setting new future strategy stack: [15:31:54.507] List of future strategies: [15:31:54.507] 1. sequential: [15:31:54.507] - args: function (..., envir = parent.frame(), workers = "") [15:31:54.507] - tweaked: FALSE [15:31:54.507] - call: NULL [15:31:54.508] plan(): nbrOfWorkers() = 1 [15:31:54.510] plan(): Setting new future strategy stack: [15:31:54.510] List of future strategies: [15:31:54.510] 1. sequential: [15:31:54.510] - args: function (..., envir = parent.frame(), workers = "") [15:31:54.510] - tweaked: FALSE [15:31:54.510] - call: plan(strategy) [15:31:54.511] plan(): nbrOfWorkers() = 1 [15:31:54.511] SequentialFuture started (and completed) [15:31:54.512] - Launch lazy future ... done [15:31:54.512] run() for 'SequentialFuture' ... done [15:31:54.512] Created future: [15:31:54.513] SequentialFuture: [15:31:54.513] Label: 'future_lapply-1' [15:31:54.513] Expression: [15:31:54.513] { [15:31:54.513] do.call(function(...) { [15:31:54.513] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:54.513] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:54.513] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:54.513] on.exit(options(oopts), add = TRUE) [15:31:54.513] } [15:31:54.513] { [15:31:54.513] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:54.513] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:54.513] ...future.FUN(...future.X_jj, ...) [15:31:54.513] }) [15:31:54.513] } [15:31:54.513] }, args = future.call.arguments) [15:31:54.513] } [15:31:54.513] Lazy evaluation: FALSE [15:31:54.513] Asynchronous evaluation: FALSE [15:31:54.513] Local evaluation: TRUE [15:31:54.513] Environment: R_GlobalEnv [15:31:54.513] Capture standard output: TRUE [15:31:54.513] Capture condition classes: 'condition' (excluding 'nothing') [15:31:54.513] Globals: 5 objects totaling 224 bytes (function '...future.FUN' of 56 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 168 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:54.513] Packages: [15:31:54.513] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:54.513] Resolved: TRUE [15:31:54.513] Value: 168 bytes of class 'list' [15:31:54.513] Early signaling: FALSE [15:31:54.513] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:54.513] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:54.515] Chunk #1 of 1 ... DONE [15:31:54.515] Launching 1 futures (chunks) ... DONE [15:31:54.515] Resolving 1 futures (chunks) ... [15:31:54.516] resolve() on list ... [15:31:54.516] recursive: 0 [15:31:54.516] length: 1 [15:31:54.516] [15:31:54.516] resolved() for 'SequentialFuture' ... [15:31:54.517] - state: 'finished' [15:31:54.517] - run: TRUE [15:31:54.517] - result: 'FutureResult' [15:31:54.518] resolved() for 'SequentialFuture' ... done [15:31:54.518] Future #1 [15:31:54.518] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:54.518] - nx: 1 [15:31:54.519] - relay: TRUE [15:31:54.519] - stdout: TRUE [15:31:54.519] - signal: TRUE [15:31:54.519] - resignal: FALSE [15:31:54.519] - force: TRUE [15:31:54.520] - relayed: [n=1] FALSE [15:31:54.520] - queued futures: [n=1] FALSE [15:31:54.520] - until=1 [15:31:54.520] - relaying element #1 [15:31:54.521] - relayed: [n=1] TRUE [15:31:54.521] - queued futures: [n=1] TRUE [15:31:54.521] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:54.522] length: 0 (resolved future 1) [15:31:54.522] Relaying remaining futures [15:31:54.522] signalConditionsASAP(NULL, pos=0) ... [15:31:54.522] - nx: 1 [15:31:54.523] - relay: TRUE [15:31:54.523] - stdout: TRUE [15:31:54.523] - signal: TRUE [15:31:54.523] - resignal: FALSE [15:31:54.523] - force: TRUE [15:31:54.524] - relayed: [n=1] TRUE [15:31:54.524] - queued futures: [n=1] TRUE - flush all [15:31:54.524] - relayed: [n=1] TRUE [15:31:54.525] - queued futures: [n=1] TRUE [15:31:54.525] signalConditionsASAP(NULL, pos=0) ... done [15:31:54.525] resolve() on list ... DONE [15:31:54.525] - Number of value chunks collected: 1 [15:31:54.526] Resolving 1 futures (chunks) ... DONE [15:31:54.526] Reducing values from 1 chunks ... [15:31:54.526] - Number of values collected after concatenation: 3 [15:31:54.527] - Number of values expected: 3 [15:31:54.527] Reducing values from 1 chunks ... DONE [15:31:54.527] future_lapply() ... DONE - future_lapply(x, ...) where x[[i]] subsets via S3 method ... [15:31:54.528] future_lapply() ... [15:31:54.528] Number of chunks: 1 [15:31:54.529] getGlobalsAndPackagesXApply() ... [15:31:54.529] - future.globals: TRUE [15:31:54.529] getGlobalsAndPackages() ... [15:31:54.529] Searching for globals... [15:31:54.531] - globals found: [1] 'FUN' [15:31:54.531] Searching for globals ... DONE [15:31:54.532] Resolving globals: FALSE [15:31:54.532] The total size of the 1 globals is 848 bytes (848 bytes) [15:31:54.533] The total size of the 1 globals exported for future expression ('FUN()') is 848 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (848 bytes of class 'function') [15:31:54.533] - globals: [1] 'FUN' [15:31:54.534] [15:31:54.534] getGlobalsAndPackages() ... DONE [15:31:54.534] - globals found/used: [n=1] 'FUN' [15:31:54.534] - needed namespaces: [n=0] [15:31:54.534] Finding globals ... DONE [15:31:54.535] - use_args: TRUE [15:31:54.535] - Getting '...' globals ... [15:31:54.536] resolve() on list ... [15:31:54.536] recursive: 0 [15:31:54.536] length: 1 [15:31:54.536] elements: '...' [15:31:54.537] length: 0 (resolved future 1) [15:31:54.537] resolve() on list ... DONE [15:31:54.537] - '...' content: [n=0] [15:31:54.537] List of 1 [15:31:54.537] $ ...: list() [15:31:54.537] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:54.537] - attr(*, "where")=List of 1 [15:31:54.537] ..$ ...: [15:31:54.537] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:54.537] - attr(*, "resolved")= logi TRUE [15:31:54.537] - attr(*, "total_size")= num NA [15:31:54.546] - Getting '...' globals ... DONE [15:31:54.547] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:54.547] List of 2 [15:31:54.547] $ ...future.FUN:function (x) [15:31:54.547] $ ... : list() [15:31:54.547] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:54.547] - attr(*, "where")=List of 2 [15:31:54.547] ..$ ...future.FUN: [15:31:54.547] ..$ ... : [15:31:54.547] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:54.547] - attr(*, "resolved")= logi FALSE [15:31:54.547] - attr(*, "total_size")= num 848 [15:31:54.553] Packages to be attached in all futures: [n=0] [15:31:54.553] getGlobalsAndPackagesXApply() ... DONE [15:31:54.553] Number of futures (= number of chunks): 1 [15:31:54.554] Launching 1 futures (chunks) ... [15:31:54.554] Chunk #1 of 1 ... [15:31:54.554] - Finding globals in 'X' for chunk #1 ... [15:31:54.554] getGlobalsAndPackages() ... [15:31:54.555] Searching for globals... [15:31:54.555] [15:31:54.555] Searching for globals ... DONE [15:31:54.556] - globals: [0] [15:31:54.556] getGlobalsAndPackages() ... DONE [15:31:54.556] + additional globals found: [n=0] [15:31:54.556] + additional namespaces needed: [n=0] [15:31:54.557] - Finding globals in 'X' for chunk #1 ... DONE [15:31:54.557] - seeds: [15:31:54.557] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:54.557] getGlobalsAndPackages() ... [15:31:54.558] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:54.558] Resolving globals: FALSE [15:31:54.558] Tweak future expression to call with '...' arguments ... [15:31:54.559] { [15:31:54.559] do.call(function(...) { [15:31:54.559] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:54.559] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:54.559] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:54.559] on.exit(options(oopts), add = TRUE) [15:31:54.559] } [15:31:54.559] { [15:31:54.559] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:54.559] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:54.559] ...future.FUN(...future.X_jj, ...) [15:31:54.559] }) [15:31:54.559] } [15:31:54.559] }, args = future.call.arguments) [15:31:54.559] } [15:31:54.559] Tweak future expression to call with '...' arguments ... DONE [15:31:54.560] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:54.560] [15:31:54.561] getGlobalsAndPackages() ... DONE [15:31:54.561] run() for 'Future' ... [15:31:54.561] - state: 'created' [15:31:54.562] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [15:31:54.562] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:54.563] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [15:31:54.563] - Field: 'label' [15:31:54.563] - Field: 'local' [15:31:54.563] - Field: 'owner' [15:31:54.564] - Field: 'envir' [15:31:54.564] - Field: 'packages' [15:31:54.564] - Field: 'gc' [15:31:54.564] - Field: 'conditions' [15:31:54.565] - Field: 'expr' [15:31:54.565] - Field: 'uuid' [15:31:54.565] - Field: 'seed' [15:31:54.565] - Field: 'version' [15:31:54.566] - Field: 'result' [15:31:54.566] - Field: 'asynchronous' [15:31:54.566] - Field: 'calls' [15:31:54.566] - Field: 'globals' [15:31:54.567] - Field: 'stdout' [15:31:54.567] - Field: 'earlySignal' [15:31:54.567] - Field: 'lazy' [15:31:54.567] - Field: 'state' [15:31:54.568] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [15:31:54.568] - Launch lazy future ... [15:31:54.568] Packages needed by the future expression (n = 0): [15:31:54.569] Packages needed by future strategies (n = 0): [15:31:54.569] { [15:31:54.569] { [15:31:54.569] { [15:31:54.569] ...future.startTime <- base::Sys.time() [15:31:54.569] { [15:31:54.569] { [15:31:54.569] { [15:31:54.569] base::local({ [15:31:54.569] has_future <- base::requireNamespace("future", [15:31:54.569] quietly = TRUE) [15:31:54.569] if (has_future) { [15:31:54.569] ns <- base::getNamespace("future") [15:31:54.569] version <- ns[[".package"]][["version"]] [15:31:54.569] if (is.null(version)) [15:31:54.569] version <- utils::packageVersion("future") [15:31:54.569] } [15:31:54.569] else { [15:31:54.569] version <- NULL [15:31:54.569] } [15:31:54.569] if (!has_future || version < "1.8.0") { [15:31:54.569] info <- base::c(r_version = base::gsub("R version ", [15:31:54.569] "", base::R.version$version.string), [15:31:54.569] platform = base::sprintf("%s (%s-bit)", [15:31:54.569] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:54.569] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:54.569] "release", "version")], collapse = " "), [15:31:54.569] hostname = base::Sys.info()[["nodename"]]) [15:31:54.569] info <- base::sprintf("%s: %s", base::names(info), [15:31:54.569] info) [15:31:54.569] info <- base::paste(info, collapse = "; ") [15:31:54.569] if (!has_future) { [15:31:54.569] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:54.569] info) [15:31:54.569] } [15:31:54.569] else { [15:31:54.569] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:54.569] info, version) [15:31:54.569] } [15:31:54.569] base::stop(msg) [15:31:54.569] } [15:31:54.569] }) [15:31:54.569] } [15:31:54.569] ...future.strategy.old <- future::plan("list") [15:31:54.569] options(future.plan = NULL) [15:31:54.569] Sys.unsetenv("R_FUTURE_PLAN") [15:31:54.569] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:54.569] } [15:31:54.569] ...future.workdir <- getwd() [15:31:54.569] } [15:31:54.569] ...future.oldOptions <- base::as.list(base::.Options) [15:31:54.569] ...future.oldEnvVars <- base::Sys.getenv() [15:31:54.569] } [15:31:54.569] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:54.569] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:54.569] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:54.569] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:54.569] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:54.569] future.stdout.windows.reencode = NULL, width = 80L) [15:31:54.569] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:54.569] base::names(...future.oldOptions)) [15:31:54.569] } [15:31:54.569] if (FALSE) { [15:31:54.569] } [15:31:54.569] else { [15:31:54.569] if (TRUE) { [15:31:54.569] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:54.569] open = "w") [15:31:54.569] } [15:31:54.569] else { [15:31:54.569] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:54.569] windows = "NUL", "/dev/null"), open = "w") [15:31:54.569] } [15:31:54.569] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:54.569] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:54.569] base::sink(type = "output", split = FALSE) [15:31:54.569] base::close(...future.stdout) [15:31:54.569] }, add = TRUE) [15:31:54.569] } [15:31:54.569] ...future.frame <- base::sys.nframe() [15:31:54.569] ...future.conditions <- base::list() [15:31:54.569] ...future.rng <- base::globalenv()$.Random.seed [15:31:54.569] if (FALSE) { [15:31:54.569] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:54.569] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:54.569] } [15:31:54.569] ...future.result <- base::tryCatch({ [15:31:54.569] base::withCallingHandlers({ [15:31:54.569] ...future.value <- base::withVisible(base::local({ [15:31:54.569] do.call(function(...) { [15:31:54.569] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:54.569] if (!identical(...future.globals.maxSize.org, [15:31:54.569] ...future.globals.maxSize)) { [15:31:54.569] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:54.569] on.exit(options(oopts), add = TRUE) [15:31:54.569] } [15:31:54.569] { [15:31:54.569] lapply(seq_along(...future.elements_ii), [15:31:54.569] FUN = function(jj) { [15:31:54.569] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:54.569] ...future.FUN(...future.X_jj, ...) [15:31:54.569] }) [15:31:54.569] } [15:31:54.569] }, args = future.call.arguments) [15:31:54.569] })) [15:31:54.569] future::FutureResult(value = ...future.value$value, [15:31:54.569] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:54.569] ...future.rng), globalenv = if (FALSE) [15:31:54.569] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:54.569] ...future.globalenv.names)) [15:31:54.569] else NULL, started = ...future.startTime, version = "1.8") [15:31:54.569] }, condition = base::local({ [15:31:54.569] c <- base::c [15:31:54.569] inherits <- base::inherits [15:31:54.569] invokeRestart <- base::invokeRestart [15:31:54.569] length <- base::length [15:31:54.569] list <- base::list [15:31:54.569] seq.int <- base::seq.int [15:31:54.569] signalCondition <- base::signalCondition [15:31:54.569] sys.calls <- base::sys.calls [15:31:54.569] `[[` <- base::`[[` [15:31:54.569] `+` <- base::`+` [15:31:54.569] `<<-` <- base::`<<-` [15:31:54.569] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:54.569] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:54.569] 3L)] [15:31:54.569] } [15:31:54.569] function(cond) { [15:31:54.569] is_error <- inherits(cond, "error") [15:31:54.569] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:54.569] NULL) [15:31:54.569] if (is_error) { [15:31:54.569] sessionInformation <- function() { [15:31:54.569] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:54.569] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:54.569] search = base::search(), system = base::Sys.info()) [15:31:54.569] } [15:31:54.569] ...future.conditions[[length(...future.conditions) + [15:31:54.569] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:54.569] cond$call), session = sessionInformation(), [15:31:54.569] timestamp = base::Sys.time(), signaled = 0L) [15:31:54.569] signalCondition(cond) [15:31:54.569] } [15:31:54.569] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:54.569] "immediateCondition"))) { [15:31:54.569] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:54.569] ...future.conditions[[length(...future.conditions) + [15:31:54.569] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:54.569] if (TRUE && !signal) { [15:31:54.569] muffleCondition <- function (cond, pattern = "^muffle") [15:31:54.569] { [15:31:54.569] inherits <- base::inherits [15:31:54.569] invokeRestart <- base::invokeRestart [15:31:54.569] is.null <- base::is.null [15:31:54.569] muffled <- FALSE [15:31:54.569] if (inherits(cond, "message")) { [15:31:54.569] muffled <- grepl(pattern, "muffleMessage") [15:31:54.569] if (muffled) [15:31:54.569] invokeRestart("muffleMessage") [15:31:54.569] } [15:31:54.569] else if (inherits(cond, "warning")) { [15:31:54.569] muffled <- grepl(pattern, "muffleWarning") [15:31:54.569] if (muffled) [15:31:54.569] invokeRestart("muffleWarning") [15:31:54.569] } [15:31:54.569] else if (inherits(cond, "condition")) { [15:31:54.569] if (!is.null(pattern)) { [15:31:54.569] computeRestarts <- base::computeRestarts [15:31:54.569] grepl <- base::grepl [15:31:54.569] restarts <- computeRestarts(cond) [15:31:54.569] for (restart in restarts) { [15:31:54.569] name <- restart$name [15:31:54.569] if (is.null(name)) [15:31:54.569] next [15:31:54.569] if (!grepl(pattern, name)) [15:31:54.569] next [15:31:54.569] invokeRestart(restart) [15:31:54.569] muffled <- TRUE [15:31:54.569] break [15:31:54.569] } [15:31:54.569] } [15:31:54.569] } [15:31:54.569] invisible(muffled) [15:31:54.569] } [15:31:54.569] muffleCondition(cond, pattern = "^muffle") [15:31:54.569] } [15:31:54.569] } [15:31:54.569] else { [15:31:54.569] if (TRUE) { [15:31:54.569] muffleCondition <- function (cond, pattern = "^muffle") [15:31:54.569] { [15:31:54.569] inherits <- base::inherits [15:31:54.569] invokeRestart <- base::invokeRestart [15:31:54.569] is.null <- base::is.null [15:31:54.569] muffled <- FALSE [15:31:54.569] if (inherits(cond, "message")) { [15:31:54.569] muffled <- grepl(pattern, "muffleMessage") [15:31:54.569] if (muffled) [15:31:54.569] invokeRestart("muffleMessage") [15:31:54.569] } [15:31:54.569] else if (inherits(cond, "warning")) { [15:31:54.569] muffled <- grepl(pattern, "muffleWarning") [15:31:54.569] if (muffled) [15:31:54.569] invokeRestart("muffleWarning") [15:31:54.569] } [15:31:54.569] else if (inherits(cond, "condition")) { [15:31:54.569] if (!is.null(pattern)) { [15:31:54.569] computeRestarts <- base::computeRestarts [15:31:54.569] grepl <- base::grepl [15:31:54.569] restarts <- computeRestarts(cond) [15:31:54.569] for (restart in restarts) { [15:31:54.569] name <- restart$name [15:31:54.569] if (is.null(name)) [15:31:54.569] next [15:31:54.569] if (!grepl(pattern, name)) [15:31:54.569] next [15:31:54.569] invokeRestart(restart) [15:31:54.569] muffled <- TRUE [15:31:54.569] break [15:31:54.569] } [15:31:54.569] } [15:31:54.569] } [15:31:54.569] invisible(muffled) [15:31:54.569] } [15:31:54.569] muffleCondition(cond, pattern = "^muffle") [15:31:54.569] } [15:31:54.569] } [15:31:54.569] } [15:31:54.569] })) [15:31:54.569] }, error = function(ex) { [15:31:54.569] base::structure(base::list(value = NULL, visible = NULL, [15:31:54.569] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:54.569] ...future.rng), started = ...future.startTime, [15:31:54.569] finished = Sys.time(), session_uuid = NA_character_, [15:31:54.569] version = "1.8"), class = "FutureResult") [15:31:54.569] }, finally = { [15:31:54.569] if (!identical(...future.workdir, getwd())) [15:31:54.569] setwd(...future.workdir) [15:31:54.569] { [15:31:54.569] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:54.569] ...future.oldOptions$nwarnings <- NULL [15:31:54.569] } [15:31:54.569] base::options(...future.oldOptions) [15:31:54.569] if (.Platform$OS.type == "windows") { [15:31:54.569] old_names <- names(...future.oldEnvVars) [15:31:54.569] envs <- base::Sys.getenv() [15:31:54.569] names <- names(envs) [15:31:54.569] common <- intersect(names, old_names) [15:31:54.569] added <- setdiff(names, old_names) [15:31:54.569] removed <- setdiff(old_names, names) [15:31:54.569] changed <- common[...future.oldEnvVars[common] != [15:31:54.569] envs[common]] [15:31:54.569] NAMES <- toupper(changed) [15:31:54.569] args <- list() [15:31:54.569] for (kk in seq_along(NAMES)) { [15:31:54.569] name <- changed[[kk]] [15:31:54.569] NAME <- NAMES[[kk]] [15:31:54.569] if (name != NAME && is.element(NAME, old_names)) [15:31:54.569] next [15:31:54.569] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:54.569] } [15:31:54.569] NAMES <- toupper(added) [15:31:54.569] for (kk in seq_along(NAMES)) { [15:31:54.569] name <- added[[kk]] [15:31:54.569] NAME <- NAMES[[kk]] [15:31:54.569] if (name != NAME && is.element(NAME, old_names)) [15:31:54.569] next [15:31:54.569] args[[name]] <- "" [15:31:54.569] } [15:31:54.569] NAMES <- toupper(removed) [15:31:54.569] for (kk in seq_along(NAMES)) { [15:31:54.569] name <- removed[[kk]] [15:31:54.569] NAME <- NAMES[[kk]] [15:31:54.569] if (name != NAME && is.element(NAME, old_names)) [15:31:54.569] next [15:31:54.569] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:54.569] } [15:31:54.569] if (length(args) > 0) [15:31:54.569] base::do.call(base::Sys.setenv, args = args) [15:31:54.569] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:54.569] } [15:31:54.569] else { [15:31:54.569] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:54.569] } [15:31:54.569] { [15:31:54.569] if (base::length(...future.futureOptionsAdded) > [15:31:54.569] 0L) { [15:31:54.569] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:54.569] base::names(opts) <- ...future.futureOptionsAdded [15:31:54.569] base::options(opts) [15:31:54.569] } [15:31:54.569] { [15:31:54.569] { [15:31:54.569] NULL [15:31:54.569] RNGkind("Mersenne-Twister") [15:31:54.569] base::rm(list = ".Random.seed", envir = base::globalenv(), [15:31:54.569] inherits = FALSE) [15:31:54.569] } [15:31:54.569] options(future.plan = NULL) [15:31:54.569] if (is.na(NA_character_)) [15:31:54.569] Sys.unsetenv("R_FUTURE_PLAN") [15:31:54.569] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:54.569] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:54.569] .init = FALSE) [15:31:54.569] } [15:31:54.569] } [15:31:54.569] } [15:31:54.569] }) [15:31:54.569] if (TRUE) { [15:31:54.569] base::sink(type = "output", split = FALSE) [15:31:54.569] if (TRUE) { [15:31:54.569] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:54.569] } [15:31:54.569] else { [15:31:54.569] ...future.result["stdout"] <- base::list(NULL) [15:31:54.569] } [15:31:54.569] base::close(...future.stdout) [15:31:54.569] ...future.stdout <- NULL [15:31:54.569] } [15:31:54.569] ...future.result$conditions <- ...future.conditions [15:31:54.569] ...future.result$finished <- base::Sys.time() [15:31:54.569] ...future.result [15:31:54.569] } [15:31:54.575] assign_globals() ... [15:31:54.576] List of 5 [15:31:54.576] $ ...future.FUN :function (x) [15:31:54.576] $ future.call.arguments : list() [15:31:54.576] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:54.576] $ ...future.elements_ii :List of 2 [15:31:54.576] ..$ a: num 0 [15:31:54.576] ..$ b: num 0 [15:31:54.576] $ ...future.seeds_ii : NULL [15:31:54.576] $ ...future.globals.maxSize: NULL [15:31:54.576] - attr(*, "where")=List of 5 [15:31:54.576] ..$ ...future.FUN : [15:31:54.576] ..$ future.call.arguments : [15:31:54.576] ..$ ...future.elements_ii : [15:31:54.576] ..$ ...future.seeds_ii : [15:31:54.576] ..$ ...future.globals.maxSize: [15:31:54.576] - attr(*, "resolved")= logi FALSE [15:31:54.576] - attr(*, "total_size")= num 848 [15:31:54.576] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:54.576] - attr(*, "already-done")= logi TRUE [15:31:54.584] - copied '...future.FUN' to environment [15:31:54.584] - copied 'future.call.arguments' to environment [15:31:54.585] - copied '...future.elements_ii' to environment [15:31:54.585] - copied '...future.seeds_ii' to environment [15:31:54.585] - copied '...future.globals.maxSize' to environment [15:31:54.585] assign_globals() ... done [15:31:54.586] plan(): Setting new future strategy stack: [15:31:54.586] List of future strategies: [15:31:54.586] 1. sequential: [15:31:54.586] - args: function (..., envir = parent.frame(), workers = "") [15:31:54.586] - tweaked: FALSE [15:31:54.586] - call: NULL [15:31:54.587] plan(): nbrOfWorkers() = 1 [15:31:54.589] plan(): Setting new future strategy stack: [15:31:54.589] List of future strategies: [15:31:54.589] 1. sequential: [15:31:54.589] - args: function (..., envir = parent.frame(), workers = "") [15:31:54.589] - tweaked: FALSE [15:31:54.589] - call: plan(strategy) [15:31:54.590] plan(): nbrOfWorkers() = 1 [15:31:54.590] SequentialFuture started (and completed) [15:31:54.590] - Launch lazy future ... done [15:31:54.590] run() for 'SequentialFuture' ... done [15:31:54.591] Created future: [15:31:54.591] SequentialFuture: [15:31:54.591] Label: 'future_lapply-1' [15:31:54.591] Expression: [15:31:54.591] { [15:31:54.591] do.call(function(...) { [15:31:54.591] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:54.591] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:54.591] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:54.591] on.exit(options(oopts), add = TRUE) [15:31:54.591] } [15:31:54.591] { [15:31:54.591] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:54.591] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:54.591] ...future.FUN(...future.X_jj, ...) [15:31:54.591] }) [15:31:54.591] } [15:31:54.591] }, args = future.call.arguments) [15:31:54.591] } [15:31:54.591] Lazy evaluation: FALSE [15:31:54.591] Asynchronous evaluation: FALSE [15:31:54.591] Local evaluation: TRUE [15:31:54.591] Environment: R_GlobalEnv [15:31:54.591] Capture standard output: TRUE [15:31:54.591] Capture condition classes: 'condition' (excluding 'nothing') [15:31:54.591] Globals: 5 objects totaling 960 bytes (function '...future.FUN' of 848 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:54.591] Packages: [15:31:54.591] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:54.591] Resolved: TRUE [15:31:54.591] Value: 112 bytes of class 'list' [15:31:54.591] Early signaling: FALSE [15:31:54.591] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:54.591] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [15:31:54.593] Chunk #1 of 1 ... DONE [15:31:54.593] Launching 1 futures (chunks) ... DONE [15:31:54.593] Resolving 1 futures (chunks) ... [15:31:54.593] resolve() on list ... [15:31:54.593] recursive: 0 [15:31:54.594] length: 1 [15:31:54.594] [15:31:54.594] resolved() for 'SequentialFuture' ... [15:31:54.594] - state: 'finished' [15:31:54.595] - run: TRUE [15:31:54.595] - result: 'FutureResult' [15:31:54.595] resolved() for 'SequentialFuture' ... done [15:31:54.595] Future #1 [15:31:54.596] signalConditionsASAP(SequentialFuture, pos=1) ... [15:31:54.596] - nx: 1 [15:31:54.596] - relay: TRUE [15:31:54.596] - stdout: TRUE [15:31:54.597] - signal: TRUE [15:31:54.597] - resignal: FALSE [15:31:54.597] - force: TRUE [15:31:54.597] - relayed: [n=1] FALSE [15:31:54.597] - queued futures: [n=1] FALSE [15:31:54.598] - until=1 [15:31:54.598] - relaying element #1 [15:31:54.598] - relayed: [n=1] TRUE [15:31:54.599] - queued futures: [n=1] TRUE [15:31:54.599] signalConditionsASAP(SequentialFuture, pos=1) ... done [15:31:54.599] length: 0 (resolved future 1) [15:31:54.599] Relaying remaining futures [15:31:54.600] signalConditionsASAP(NULL, pos=0) ... [15:31:54.600] - nx: 1 [15:31:54.600] - relay: TRUE [15:31:54.600] - stdout: TRUE [15:31:54.600] - signal: TRUE [15:31:54.601] - resignal: FALSE [15:31:54.601] - force: TRUE [15:31:54.601] - relayed: [n=1] TRUE [15:31:54.601] - queued futures: [n=1] TRUE - flush all [15:31:54.602] - relayed: [n=1] TRUE [15:31:54.602] - queued futures: [n=1] TRUE [15:31:54.602] signalConditionsASAP(NULL, pos=0) ... done [15:31:54.602] resolve() on list ... DONE [15:31:54.603] - Number of value chunks collected: 1 [15:31:54.603] Resolving 1 futures (chunks) ... DONE [15:31:54.603] Reducing values from 1 chunks ... [15:31:54.603] - Number of values collected after concatenation: 2 [15:31:54.604] - Number of values expected: 2 [15:31:54.604] Reducing values from 1 chunks ... DONE [15:31:54.604] future_lapply() ... DONE - plan('multisession') ... [15:31:54.605] plan(): Setting new future strategy stack: [15:31:54.605] List of future strategies: [15:31:54.605] 1. multisession: [15:31:54.605] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:54.605] - tweaked: FALSE [15:31:54.605] - call: plan(strategy) [15:31:54.606] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... [15:31:54.606] multisession: [15:31:54.606] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [15:31:54.606] - tweaked: FALSE [15:31:54.606] - call: plan(strategy) [15:31:54.612] getGlobalsAndPackages() ... [15:31:54.613] Not searching for globals [15:31:54.613] - globals: [0] [15:31:54.613] getGlobalsAndPackages() ... DONE [15:31:54.614] [local output] makeClusterPSOCK() ... [15:31:54.678] [local output] Workers: [n = 2] 'localhost', 'localhost' [15:31:54.685] [local output] Base port: 29632 [15:31:54.685] [local output] Getting setup options for 2 cluster nodes ... [15:31:54.685] [local output] - Node 1 of 2 ... [15:31:54.686] [local output] localMachine=TRUE => revtunnel=FALSE [15:31:54.688] Testing if worker's PID can be inferred: '"D:/RCompile/recent/R/bin/x64/Rscript" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/RtmpWoLvsC/worker.rank=1.parallelly.parent=134880.20ee01d473c2f.pid\")), silent = TRUE)" -e "file.exists(\"D:/temp/RtmpWoLvsC/worker.rank=1.parallelly.parent=134880.20ee01d473c2f.pid\")"' [15:31:55.234] - Possible to infer worker's PID: TRUE [15:31:55.235] [local output] Rscript port: 29632 [15:31:55.236] [local output] - Node 2 of 2 ... [15:31:55.237] [local output] localMachine=TRUE => revtunnel=FALSE [15:31:55.239] [local output] Rscript port: 29632 [15:31:55.240] [local output] Getting setup options for 2 cluster nodes ... done [15:31:55.240] [local output] - Parallel setup requested for some PSOCK nodes [15:31:55.242] [local output] Setting up PSOCK nodes in parallel [15:31:55.242] List of 36 [15:31:55.242] $ worker : chr "localhost" [15:31:55.242] ..- attr(*, "localhost")= logi TRUE [15:31:55.242] $ master : chr "localhost" [15:31:55.242] $ port : int 29632 [15:31:55.242] $ connectTimeout : num 120 [15:31:55.242] $ timeout : num 120 [15:31:55.242] $ rscript : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\"" [15:31:55.242] $ homogeneous : logi TRUE [15:31:55.242] $ rscript_args : chr "--default-packages=datasets,utils,grDevices,graphics,stats,methods -e \"#label=future_lapply.R:134880:CRANWIN3:"| __truncated__ [15:31:55.242] $ rscript_envs : NULL [15:31:55.242] $ rscript_libs : chr [1:2] "D:/temp/RtmpIhDozX/RLIBS_2bbc83f2b47c7" "D:/RCompile/recent/R/library" [15:31:55.242] $ rscript_startup : NULL [15:31:55.242] $ rscript_sh : chr "cmd" [15:31:55.242] $ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [15:31:55.242] $ methods : logi TRUE [15:31:55.242] $ socketOptions : chr "no-delay" [15:31:55.242] $ useXDR : logi FALSE [15:31:55.242] $ outfile : chr "/dev/null" [15:31:55.242] $ renice : int NA [15:31:55.242] $ rshcmd : NULL [15:31:55.242] $ user : chr(0) [15:31:55.242] $ revtunnel : logi FALSE [15:31:55.242] $ rshlogfile : NULL [15:31:55.242] $ rshopts : chr(0) [15:31:55.242] $ rank : int 1 [15:31:55.242] $ manual : logi FALSE [15:31:55.242] $ dryrun : logi FALSE [15:31:55.242] $ quiet : logi FALSE [15:31:55.242] $ setup_strategy : chr "parallel" [15:31:55.242] $ local_cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [15:31:55.242] $ pidfile : chr "D:/temp/RtmpWoLvsC/worker.rank=1.parallelly.parent=134880.20ee01d473c2f.pid" [15:31:55.242] $ rshcmd_label : NULL [15:31:55.242] $ rsh_call : NULL [15:31:55.242] $ cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [15:31:55.242] $ localMachine : logi TRUE [15:31:55.242] $ make_fcn :function (worker = getOption2("parallelly.localhost.hostname", "localhost"), [15:31:55.242] master = NULL, port, connectTimeout = getOption2("parallelly.makeNodePSOCK.connectTimeout", [15:31:55.242] 2 * 60), timeout = getOption2("parallelly.makeNodePSOCK.timeout", [15:31:55.242] 30 * 24 * 60 * 60), rscript = NULL, homogeneous = NULL, rscript_args = NULL, [15:31:55.242] rscript_envs = NULL, rscript_libs = NULL, rscript_startup = NULL, rscript_sh = c("auto", [15:31:55.242] "cmd", "sh"), default_packages = c("datasets", "utils", "grDevices", [15:31:55.242] "graphics", "stats", if (methods) "methods"), methods = TRUE, socketOptions = getOption2("parallelly.makeNodePSOCK.socketOptions", [15:31:55.242] "no-delay"), useXDR = getOption2("parallelly.makeNodePSOCK.useXDR", [15:31:55.242] FALSE), outfile = "/dev/null", renice = NA_integer_, rshcmd = getOption2("parallelly.makeNodePSOCK.rshcmd", [15:31:55.242] NULL), user = NULL, revtunnel = NA, rshlogfile = NULL, rshopts = getOption2("parallelly.makeNodePSOCK.rshopts", [15:31:55.242] NULL), rank = 1L, manual = FALSE, dryrun = FALSE, quiet = FALSE, [15:31:55.242] setup_strategy = getOption2("parallelly.makeNodePSOCK.setup_strategy", [15:31:55.242] "parallel"), action = c("launch", "options"), verbose = FALSE) [15:31:55.242] $ arguments :List of 28 [15:31:55.242] ..$ worker : chr "localhost" [15:31:55.242] ..$ master : NULL [15:31:55.242] ..$ port : int 29632 [15:31:55.242] ..$ connectTimeout : num 120 [15:31:55.242] ..$ timeout : num 120 [15:31:55.242] ..$ rscript : NULL [15:31:55.242] ..$ homogeneous : NULL [15:31:55.242] ..$ rscript_args : NULL [15:31:55.242] ..$ rscript_envs : NULL [15:31:55.242] ..$ rscript_libs : chr [1:2] "D:/temp/RtmpIhDozX/RLIBS_2bbc83f2b47c7" "D:/RCompile/recent/R/library" [15:31:55.242] ..$ rscript_startup : NULL [15:31:55.242] ..$ rscript_sh : chr [1:3] "auto" "cmd" "sh" [15:31:55.242] ..$ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [15:31:55.242] ..$ methods : logi TRUE [15:31:55.242] ..$ socketOptions : chr "no-delay" [15:31:55.242] ..$ useXDR : logi FALSE [15:31:55.242] ..$ outfile : chr "/dev/null" [15:31:55.242] ..$ renice : int NA [15:31:55.242] ..$ rshcmd : NULL [15:31:55.242] ..$ user : NULL [15:31:55.242] ..$ revtunnel : logi NA [15:31:55.242] ..$ rshlogfile : NULL [15:31:55.242] ..$ rshopts : NULL [15:31:55.242] ..$ rank : int 1 [15:31:55.242] ..$ manual : logi FALSE [15:31:55.242] ..$ dryrun : logi FALSE [15:31:55.242] ..$ quiet : logi FALSE [15:31:55.242] ..$ setup_strategy : chr "parallel" [15:31:55.242] - attr(*, "class")= chr [1:2] "makeNodePSOCKOptions" "makeNodeOptions" [15:31:55.277] [local output] System call to launch all workers: [15:31:55.278] [local output] "D:/RCompile/recent/R/bin/x64/Rscript" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "#label=future_lapply.R:134880:CRANWIN3:CRAN" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/RtmpWoLvsC/worker.rank=1.parallelly.parent=134880.20ee01d473c2f.pid\")), silent = TRUE)" -e "options(socketOptions = \"no-delay\")" -e ".libPaths(c(\"D:/temp/RtmpIhDozX/RLIBS_2bbc83f2b47c7\",\"D:/RCompile/recent/R/library\"))" -e "workRSOCK <- tryCatch(parallel:::.workRSOCK, error=function(e) parallel:::.slaveRSOCK); workRSOCK()" MASTER=localhost PORT=29632 OUT=/dev/null TIMEOUT=120 XDR=FALSE SETUPTIMEOUT=120 SETUPSTRATEGY=parallel [15:31:55.278] [local output] Starting PSOCK main server [15:31:55.287] [local output] Workers launched [15:31:55.288] [local output] Waiting for workers to connect back [15:31:55.288] - [local output] 0 workers out of 2 ready [15:31:55.508] - [local output] 0 workers out of 2 ready [15:31:55.509] - [local output] 1 workers out of 2 ready [15:31:55.525] - [local output] 1 workers out of 2 ready [15:31:55.525] - [local output] 2 workers out of 2 ready [15:31:55.526] [local output] Launching of workers completed [15:31:55.526] [local output] Collecting session information from workers [15:31:55.527] [local output] - Worker #1 of 2 [15:31:55.528] [local output] - Worker #2 of 2 [15:31:55.529] [local output] makeClusterPSOCK() ... done [15:31:55.546] Packages needed by the future expression (n = 0): [15:31:55.546] Packages needed by future strategies (n = 0): [15:31:55.547] { [15:31:55.547] { [15:31:55.547] { [15:31:55.547] ...future.startTime <- base::Sys.time() [15:31:55.547] { [15:31:55.547] { [15:31:55.547] { [15:31:55.547] { [15:31:55.547] base::local({ [15:31:55.547] has_future <- base::requireNamespace("future", [15:31:55.547] quietly = TRUE) [15:31:55.547] if (has_future) { [15:31:55.547] ns <- base::getNamespace("future") [15:31:55.547] version <- ns[[".package"]][["version"]] [15:31:55.547] if (is.null(version)) [15:31:55.547] version <- utils::packageVersion("future") [15:31:55.547] } [15:31:55.547] else { [15:31:55.547] version <- NULL [15:31:55.547] } [15:31:55.547] if (!has_future || version < "1.8.0") { [15:31:55.547] info <- base::c(r_version = base::gsub("R version ", [15:31:55.547] "", base::R.version$version.string), [15:31:55.547] platform = base::sprintf("%s (%s-bit)", [15:31:55.547] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:55.547] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:55.547] "release", "version")], collapse = " "), [15:31:55.547] hostname = base::Sys.info()[["nodename"]]) [15:31:55.547] info <- base::sprintf("%s: %s", base::names(info), [15:31:55.547] info) [15:31:55.547] info <- base::paste(info, collapse = "; ") [15:31:55.547] if (!has_future) { [15:31:55.547] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:55.547] info) [15:31:55.547] } [15:31:55.547] else { [15:31:55.547] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:55.547] info, version) [15:31:55.547] } [15:31:55.547] base::stop(msg) [15:31:55.547] } [15:31:55.547] }) [15:31:55.547] } [15:31:55.547] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:55.547] base::options(mc.cores = 1L) [15:31:55.547] } [15:31:55.547] ...future.strategy.old <- future::plan("list") [15:31:55.547] options(future.plan = NULL) [15:31:55.547] Sys.unsetenv("R_FUTURE_PLAN") [15:31:55.547] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:55.547] } [15:31:55.547] ...future.workdir <- getwd() [15:31:55.547] } [15:31:55.547] ...future.oldOptions <- base::as.list(base::.Options) [15:31:55.547] ...future.oldEnvVars <- base::Sys.getenv() [15:31:55.547] } [15:31:55.547] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:55.547] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:55.547] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:55.547] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:55.547] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:55.547] future.stdout.windows.reencode = NULL, width = 80L) [15:31:55.547] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:55.547] base::names(...future.oldOptions)) [15:31:55.547] } [15:31:55.547] if (FALSE) { [15:31:55.547] } [15:31:55.547] else { [15:31:55.547] if (TRUE) { [15:31:55.547] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:55.547] open = "w") [15:31:55.547] } [15:31:55.547] else { [15:31:55.547] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:55.547] windows = "NUL", "/dev/null"), open = "w") [15:31:55.547] } [15:31:55.547] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:55.547] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:55.547] base::sink(type = "output", split = FALSE) [15:31:55.547] base::close(...future.stdout) [15:31:55.547] }, add = TRUE) [15:31:55.547] } [15:31:55.547] ...future.frame <- base::sys.nframe() [15:31:55.547] ...future.conditions <- base::list() [15:31:55.547] ...future.rng <- base::globalenv()$.Random.seed [15:31:55.547] if (FALSE) { [15:31:55.547] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:55.547] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:55.547] } [15:31:55.547] ...future.result <- base::tryCatch({ [15:31:55.547] base::withCallingHandlers({ [15:31:55.547] ...future.value <- base::withVisible(base::local({ [15:31:55.547] ...future.makeSendCondition <- base::local({ [15:31:55.547] sendCondition <- NULL [15:31:55.547] function(frame = 1L) { [15:31:55.547] if (is.function(sendCondition)) [15:31:55.547] return(sendCondition) [15:31:55.547] ns <- getNamespace("parallel") [15:31:55.547] if (exists("sendData", mode = "function", [15:31:55.547] envir = ns)) { [15:31:55.547] parallel_sendData <- get("sendData", mode = "function", [15:31:55.547] envir = ns) [15:31:55.547] envir <- sys.frame(frame) [15:31:55.547] master <- NULL [15:31:55.547] while (!identical(envir, .GlobalEnv) && [15:31:55.547] !identical(envir, emptyenv())) { [15:31:55.547] if (exists("master", mode = "list", envir = envir, [15:31:55.547] inherits = FALSE)) { [15:31:55.547] master <- get("master", mode = "list", [15:31:55.547] envir = envir, inherits = FALSE) [15:31:55.547] if (inherits(master, c("SOCKnode", [15:31:55.547] "SOCK0node"))) { [15:31:55.547] sendCondition <<- function(cond) { [15:31:55.547] data <- list(type = "VALUE", value = cond, [15:31:55.547] success = TRUE) [15:31:55.547] parallel_sendData(master, data) [15:31:55.547] } [15:31:55.547] return(sendCondition) [15:31:55.547] } [15:31:55.547] } [15:31:55.547] frame <- frame + 1L [15:31:55.547] envir <- sys.frame(frame) [15:31:55.547] } [15:31:55.547] } [15:31:55.547] sendCondition <<- function(cond) NULL [15:31:55.547] } [15:31:55.547] }) [15:31:55.547] withCallingHandlers({ [15:31:55.547] NA [15:31:55.547] }, immediateCondition = function(cond) { [15:31:55.547] sendCondition <- ...future.makeSendCondition() [15:31:55.547] sendCondition(cond) [15:31:55.547] muffleCondition <- function (cond, pattern = "^muffle") [15:31:55.547] { [15:31:55.547] inherits <- base::inherits [15:31:55.547] invokeRestart <- base::invokeRestart [15:31:55.547] is.null <- base::is.null [15:31:55.547] muffled <- FALSE [15:31:55.547] if (inherits(cond, "message")) { [15:31:55.547] muffled <- grepl(pattern, "muffleMessage") [15:31:55.547] if (muffled) [15:31:55.547] invokeRestart("muffleMessage") [15:31:55.547] } [15:31:55.547] else if (inherits(cond, "warning")) { [15:31:55.547] muffled <- grepl(pattern, "muffleWarning") [15:31:55.547] if (muffled) [15:31:55.547] invokeRestart("muffleWarning") [15:31:55.547] } [15:31:55.547] else if (inherits(cond, "condition")) { [15:31:55.547] if (!is.null(pattern)) { [15:31:55.547] computeRestarts <- base::computeRestarts [15:31:55.547] grepl <- base::grepl [15:31:55.547] restarts <- computeRestarts(cond) [15:31:55.547] for (restart in restarts) { [15:31:55.547] name <- restart$name [15:31:55.547] if (is.null(name)) [15:31:55.547] next [15:31:55.547] if (!grepl(pattern, name)) [15:31:55.547] next [15:31:55.547] invokeRestart(restart) [15:31:55.547] muffled <- TRUE [15:31:55.547] break [15:31:55.547] } [15:31:55.547] } [15:31:55.547] } [15:31:55.547] invisible(muffled) [15:31:55.547] } [15:31:55.547] muffleCondition(cond) [15:31:55.547] }) [15:31:55.547] })) [15:31:55.547] future::FutureResult(value = ...future.value$value, [15:31:55.547] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:55.547] ...future.rng), globalenv = if (FALSE) [15:31:55.547] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:55.547] ...future.globalenv.names)) [15:31:55.547] else NULL, started = ...future.startTime, version = "1.8") [15:31:55.547] }, condition = base::local({ [15:31:55.547] c <- base::c [15:31:55.547] inherits <- base::inherits [15:31:55.547] invokeRestart <- base::invokeRestart [15:31:55.547] length <- base::length [15:31:55.547] list <- base::list [15:31:55.547] seq.int <- base::seq.int [15:31:55.547] signalCondition <- base::signalCondition [15:31:55.547] sys.calls <- base::sys.calls [15:31:55.547] `[[` <- base::`[[` [15:31:55.547] `+` <- base::`+` [15:31:55.547] `<<-` <- base::`<<-` [15:31:55.547] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:55.547] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:55.547] 3L)] [15:31:55.547] } [15:31:55.547] function(cond) { [15:31:55.547] is_error <- inherits(cond, "error") [15:31:55.547] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:55.547] NULL) [15:31:55.547] if (is_error) { [15:31:55.547] sessionInformation <- function() { [15:31:55.547] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:55.547] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:55.547] search = base::search(), system = base::Sys.info()) [15:31:55.547] } [15:31:55.547] ...future.conditions[[length(...future.conditions) + [15:31:55.547] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:55.547] cond$call), session = sessionInformation(), [15:31:55.547] timestamp = base::Sys.time(), signaled = 0L) [15:31:55.547] signalCondition(cond) [15:31:55.547] } [15:31:55.547] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:55.547] "immediateCondition"))) { [15:31:55.547] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:55.547] ...future.conditions[[length(...future.conditions) + [15:31:55.547] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:55.547] if (TRUE && !signal) { [15:31:55.547] muffleCondition <- function (cond, pattern = "^muffle") [15:31:55.547] { [15:31:55.547] inherits <- base::inherits [15:31:55.547] invokeRestart <- base::invokeRestart [15:31:55.547] is.null <- base::is.null [15:31:55.547] muffled <- FALSE [15:31:55.547] if (inherits(cond, "message")) { [15:31:55.547] muffled <- grepl(pattern, "muffleMessage") [15:31:55.547] if (muffled) [15:31:55.547] invokeRestart("muffleMessage") [15:31:55.547] } [15:31:55.547] else if (inherits(cond, "warning")) { [15:31:55.547] muffled <- grepl(pattern, "muffleWarning") [15:31:55.547] if (muffled) [15:31:55.547] invokeRestart("muffleWarning") [15:31:55.547] } [15:31:55.547] else if (inherits(cond, "condition")) { [15:31:55.547] if (!is.null(pattern)) { [15:31:55.547] computeRestarts <- base::computeRestarts [15:31:55.547] grepl <- base::grepl [15:31:55.547] restarts <- computeRestarts(cond) [15:31:55.547] for (restart in restarts) { [15:31:55.547] name <- restart$name [15:31:55.547] if (is.null(name)) [15:31:55.547] next [15:31:55.547] if (!grepl(pattern, name)) [15:31:55.547] next [15:31:55.547] invokeRestart(restart) [15:31:55.547] muffled <- TRUE [15:31:55.547] break [15:31:55.547] } [15:31:55.547] } [15:31:55.547] } [15:31:55.547] invisible(muffled) [15:31:55.547] } [15:31:55.547] muffleCondition(cond, pattern = "^muffle") [15:31:55.547] } [15:31:55.547] } [15:31:55.547] else { [15:31:55.547] if (TRUE) { [15:31:55.547] muffleCondition <- function (cond, pattern = "^muffle") [15:31:55.547] { [15:31:55.547] inherits <- base::inherits [15:31:55.547] invokeRestart <- base::invokeRestart [15:31:55.547] is.null <- base::is.null [15:31:55.547] muffled <- FALSE [15:31:55.547] if (inherits(cond, "message")) { [15:31:55.547] muffled <- grepl(pattern, "muffleMessage") [15:31:55.547] if (muffled) [15:31:55.547] invokeRestart("muffleMessage") [15:31:55.547] } [15:31:55.547] else if (inherits(cond, "warning")) { [15:31:55.547] muffled <- grepl(pattern, "muffleWarning") [15:31:55.547] if (muffled) [15:31:55.547] invokeRestart("muffleWarning") [15:31:55.547] } [15:31:55.547] else if (inherits(cond, "condition")) { [15:31:55.547] if (!is.null(pattern)) { [15:31:55.547] computeRestarts <- base::computeRestarts [15:31:55.547] grepl <- base::grepl [15:31:55.547] restarts <- computeRestarts(cond) [15:31:55.547] for (restart in restarts) { [15:31:55.547] name <- restart$name [15:31:55.547] if (is.null(name)) [15:31:55.547] next [15:31:55.547] if (!grepl(pattern, name)) [15:31:55.547] next [15:31:55.547] invokeRestart(restart) [15:31:55.547] muffled <- TRUE [15:31:55.547] break [15:31:55.547] } [15:31:55.547] } [15:31:55.547] } [15:31:55.547] invisible(muffled) [15:31:55.547] } [15:31:55.547] muffleCondition(cond, pattern = "^muffle") [15:31:55.547] } [15:31:55.547] } [15:31:55.547] } [15:31:55.547] })) [15:31:55.547] }, error = function(ex) { [15:31:55.547] base::structure(base::list(value = NULL, visible = NULL, [15:31:55.547] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:55.547] ...future.rng), started = ...future.startTime, [15:31:55.547] finished = Sys.time(), session_uuid = NA_character_, [15:31:55.547] version = "1.8"), class = "FutureResult") [15:31:55.547] }, finally = { [15:31:55.547] if (!identical(...future.workdir, getwd())) [15:31:55.547] setwd(...future.workdir) [15:31:55.547] { [15:31:55.547] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:55.547] ...future.oldOptions$nwarnings <- NULL [15:31:55.547] } [15:31:55.547] base::options(...future.oldOptions) [15:31:55.547] if (.Platform$OS.type == "windows") { [15:31:55.547] old_names <- names(...future.oldEnvVars) [15:31:55.547] envs <- base::Sys.getenv() [15:31:55.547] names <- names(envs) [15:31:55.547] common <- intersect(names, old_names) [15:31:55.547] added <- setdiff(names, old_names) [15:31:55.547] removed <- setdiff(old_names, names) [15:31:55.547] changed <- common[...future.oldEnvVars[common] != [15:31:55.547] envs[common]] [15:31:55.547] NAMES <- toupper(changed) [15:31:55.547] args <- list() [15:31:55.547] for (kk in seq_along(NAMES)) { [15:31:55.547] name <- changed[[kk]] [15:31:55.547] NAME <- NAMES[[kk]] [15:31:55.547] if (name != NAME && is.element(NAME, old_names)) [15:31:55.547] next [15:31:55.547] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:55.547] } [15:31:55.547] NAMES <- toupper(added) [15:31:55.547] for (kk in seq_along(NAMES)) { [15:31:55.547] name <- added[[kk]] [15:31:55.547] NAME <- NAMES[[kk]] [15:31:55.547] if (name != NAME && is.element(NAME, old_names)) [15:31:55.547] next [15:31:55.547] args[[name]] <- "" [15:31:55.547] } [15:31:55.547] NAMES <- toupper(removed) [15:31:55.547] for (kk in seq_along(NAMES)) { [15:31:55.547] name <- removed[[kk]] [15:31:55.547] NAME <- NAMES[[kk]] [15:31:55.547] if (name != NAME && is.element(NAME, old_names)) [15:31:55.547] next [15:31:55.547] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:55.547] } [15:31:55.547] if (length(args) > 0) [15:31:55.547] base::do.call(base::Sys.setenv, args = args) [15:31:55.547] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:55.547] } [15:31:55.547] else { [15:31:55.547] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:55.547] } [15:31:55.547] { [15:31:55.547] if (base::length(...future.futureOptionsAdded) > [15:31:55.547] 0L) { [15:31:55.547] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:55.547] base::names(opts) <- ...future.futureOptionsAdded [15:31:55.547] base::options(opts) [15:31:55.547] } [15:31:55.547] { [15:31:55.547] { [15:31:55.547] base::options(mc.cores = ...future.mc.cores.old) [15:31:55.547] NULL [15:31:55.547] } [15:31:55.547] options(future.plan = NULL) [15:31:55.547] if (is.na(NA_character_)) [15:31:55.547] Sys.unsetenv("R_FUTURE_PLAN") [15:31:55.547] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:55.547] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:55.547] .init = FALSE) [15:31:55.547] } [15:31:55.547] } [15:31:55.547] } [15:31:55.547] }) [15:31:55.547] if (TRUE) { [15:31:55.547] base::sink(type = "output", split = FALSE) [15:31:55.547] if (TRUE) { [15:31:55.547] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:55.547] } [15:31:55.547] else { [15:31:55.547] ...future.result["stdout"] <- base::list(NULL) [15:31:55.547] } [15:31:55.547] base::close(...future.stdout) [15:31:55.547] ...future.stdout <- NULL [15:31:55.547] } [15:31:55.547] ...future.result$conditions <- ...future.conditions [15:31:55.547] ...future.result$finished <- base::Sys.time() [15:31:55.547] ...future.result [15:31:55.547] } [15:31:55.669] MultisessionFuture started [15:31:55.669] result() for ClusterFuture ... [15:31:55.670] receiveMessageFromWorker() for ClusterFuture ... [15:31:55.670] - Validating connection of MultisessionFuture [15:31:55.749] - received message: FutureResult [15:31:55.749] - Received FutureResult [15:31:55.754] - Erased future from FutureRegistry [15:31:55.754] result() for ClusterFuture ... [15:31:55.754] - result already collected: FutureResult [15:31:55.755] result() for ClusterFuture ... done [15:31:55.755] receiveMessageFromWorker() for ClusterFuture ... done [15:31:55.755] result() for ClusterFuture ... done [15:31:55.756] result() for ClusterFuture ... [15:31:55.756] - result already collected: FutureResult [15:31:55.756] result() for ClusterFuture ... done [15:31:55.756] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... DONE [15:31:55.759] plan(): nbrOfWorkers() = 2 - future_lapply(x, FUN = vector, ...) ... [15:31:55.759] future_lapply() ... [15:31:55.763] Number of chunks: 4 [15:31:55.763] getGlobalsAndPackagesXApply() ... [15:31:55.763] - future.globals: TRUE [15:31:55.763] getGlobalsAndPackages() ... [15:31:55.763] Searching for globals... [15:31:55.765] - globals found: [2] 'FUN', '.Internal' [15:31:55.765] Searching for globals ... DONE [15:31:55.766] Resolving globals: FALSE [15:31:55.767] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:55.767] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:55.768] - globals: [1] 'FUN' [15:31:55.768] [15:31:55.768] getGlobalsAndPackages() ... DONE [15:31:55.769] - globals found/used: [n=1] 'FUN' [15:31:55.769] - needed namespaces: [n=0] [15:31:55.769] Finding globals ... DONE [15:31:55.769] - use_args: TRUE [15:31:55.770] - Getting '...' globals ... [15:31:55.771] resolve() on list ... [15:31:55.771] recursive: 0 [15:31:55.771] length: 1 [15:31:55.771] elements: '...' [15:31:55.772] length: 0 (resolved future 1) [15:31:55.772] resolve() on list ... DONE [15:31:55.772] - '...' content: [n=1] 'length' [15:31:55.773] List of 1 [15:31:55.773] $ ...:List of 1 [15:31:55.773] ..$ length: int 2 [15:31:55.773] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:55.773] - attr(*, "where")=List of 1 [15:31:55.773] ..$ ...: [15:31:55.773] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:55.773] - attr(*, "resolved")= logi TRUE [15:31:55.773] - attr(*, "total_size")= num NA [15:31:55.779] - Getting '...' globals ... DONE [15:31:55.779] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:55.780] List of 2 [15:31:55.780] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:55.780] $ ... :List of 1 [15:31:55.780] ..$ length: int 2 [15:31:55.780] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:55.780] - attr(*, "where")=List of 2 [15:31:55.780] ..$ ...future.FUN: [15:31:55.780] ..$ ... : [15:31:55.780] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:55.780] - attr(*, "resolved")= logi FALSE [15:31:55.780] - attr(*, "total_size")= num 2240 [15:31:55.786] Packages to be attached in all futures: [n=0] [15:31:55.786] getGlobalsAndPackagesXApply() ... DONE [15:31:55.787] Number of futures (= number of chunks): 4 [15:31:55.787] Launching 4 futures (chunks) ... [15:31:55.788] Chunk #1 of 4 ... [15:31:55.788] - Finding globals in 'X' for chunk #1 ... [15:31:55.788] getGlobalsAndPackages() ... [15:31:55.789] Searching for globals... [15:31:55.789] [15:31:55.789] Searching for globals ... DONE [15:31:55.790] - globals: [0] [15:31:55.790] getGlobalsAndPackages() ... DONE [15:31:55.790] + additional globals found: [n=0] [15:31:55.791] + additional namespaces needed: [n=0] [15:31:55.791] - Finding globals in 'X' for chunk #1 ... DONE [15:31:55.791] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:55.792] - seeds: [15:31:55.792] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:55.792] getGlobalsAndPackages() ... [15:31:55.793] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:55.793] Resolving globals: FALSE [15:31:55.793] Tweak future expression to call with '...' arguments ... [15:31:55.793] { [15:31:55.793] do.call(function(...) { [15:31:55.793] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:55.793] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:55.793] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:55.793] on.exit(options(oopts), add = TRUE) [15:31:55.793] } [15:31:55.793] { [15:31:55.793] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:55.793] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:55.793] ...future.FUN(...future.X_jj, ...) [15:31:55.793] }) [15:31:55.793] } [15:31:55.793] }, args = future.call.arguments) [15:31:55.793] } [15:31:55.794] Tweak future expression to call with '...' arguments ... DONE [15:31:55.795] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:55.795] [15:31:55.796] getGlobalsAndPackages() ... DONE [15:31:55.796] run() for 'Future' ... [15:31:55.797] - state: 'created' [15:31:55.797] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:55.816] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:55.817] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:55.817] - Field: 'node' [15:31:55.818] - Field: 'label' [15:31:55.818] - Field: 'local' [15:31:55.818] - Field: 'owner' [15:31:55.819] - Field: 'envir' [15:31:55.819] - Field: 'workers' [15:31:55.819] - Field: 'packages' [15:31:55.820] - Field: 'gc' [15:31:55.820] - Field: 'conditions' [15:31:55.820] - Field: 'persistent' [15:31:55.821] - Field: 'expr' [15:31:55.821] - Field: 'uuid' [15:31:55.821] - Field: 'seed' [15:31:55.822] - Field: 'version' [15:31:55.822] - Field: 'result' [15:31:55.822] - Field: 'asynchronous' [15:31:55.822] - Field: 'calls' [15:31:55.823] - Field: 'globals' [15:31:55.823] - Field: 'stdout' [15:31:55.823] - Field: 'earlySignal' [15:31:55.824] - Field: 'lazy' [15:31:55.824] - Field: 'state' [15:31:55.824] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:55.825] - Launch lazy future ... [15:31:55.825] Packages needed by the future expression (n = 0): [15:31:55.826] Packages needed by future strategies (n = 0): [15:31:55.827] { [15:31:55.827] { [15:31:55.827] { [15:31:55.827] ...future.startTime <- base::Sys.time() [15:31:55.827] { [15:31:55.827] { [15:31:55.827] { [15:31:55.827] { [15:31:55.827] base::local({ [15:31:55.827] has_future <- base::requireNamespace("future", [15:31:55.827] quietly = TRUE) [15:31:55.827] if (has_future) { [15:31:55.827] ns <- base::getNamespace("future") [15:31:55.827] version <- ns[[".package"]][["version"]] [15:31:55.827] if (is.null(version)) [15:31:55.827] version <- utils::packageVersion("future") [15:31:55.827] } [15:31:55.827] else { [15:31:55.827] version <- NULL [15:31:55.827] } [15:31:55.827] if (!has_future || version < "1.8.0") { [15:31:55.827] info <- base::c(r_version = base::gsub("R version ", [15:31:55.827] "", base::R.version$version.string), [15:31:55.827] platform = base::sprintf("%s (%s-bit)", [15:31:55.827] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:55.827] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:55.827] "release", "version")], collapse = " "), [15:31:55.827] hostname = base::Sys.info()[["nodename"]]) [15:31:55.827] info <- base::sprintf("%s: %s", base::names(info), [15:31:55.827] info) [15:31:55.827] info <- base::paste(info, collapse = "; ") [15:31:55.827] if (!has_future) { [15:31:55.827] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:55.827] info) [15:31:55.827] } [15:31:55.827] else { [15:31:55.827] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:55.827] info, version) [15:31:55.827] } [15:31:55.827] base::stop(msg) [15:31:55.827] } [15:31:55.827] }) [15:31:55.827] } [15:31:55.827] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:55.827] base::options(mc.cores = 1L) [15:31:55.827] } [15:31:55.827] ...future.strategy.old <- future::plan("list") [15:31:55.827] options(future.plan = NULL) [15:31:55.827] Sys.unsetenv("R_FUTURE_PLAN") [15:31:55.827] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:55.827] } [15:31:55.827] ...future.workdir <- getwd() [15:31:55.827] } [15:31:55.827] ...future.oldOptions <- base::as.list(base::.Options) [15:31:55.827] ...future.oldEnvVars <- base::Sys.getenv() [15:31:55.827] } [15:31:55.827] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:55.827] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:55.827] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:55.827] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:55.827] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:55.827] future.stdout.windows.reencode = NULL, width = 80L) [15:31:55.827] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:55.827] base::names(...future.oldOptions)) [15:31:55.827] } [15:31:55.827] if (FALSE) { [15:31:55.827] } [15:31:55.827] else { [15:31:55.827] if (TRUE) { [15:31:55.827] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:55.827] open = "w") [15:31:55.827] } [15:31:55.827] else { [15:31:55.827] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:55.827] windows = "NUL", "/dev/null"), open = "w") [15:31:55.827] } [15:31:55.827] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:55.827] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:55.827] base::sink(type = "output", split = FALSE) [15:31:55.827] base::close(...future.stdout) [15:31:55.827] }, add = TRUE) [15:31:55.827] } [15:31:55.827] ...future.frame <- base::sys.nframe() [15:31:55.827] ...future.conditions <- base::list() [15:31:55.827] ...future.rng <- base::globalenv()$.Random.seed [15:31:55.827] if (FALSE) { [15:31:55.827] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:55.827] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:55.827] } [15:31:55.827] ...future.result <- base::tryCatch({ [15:31:55.827] base::withCallingHandlers({ [15:31:55.827] ...future.value <- base::withVisible(base::local({ [15:31:55.827] ...future.makeSendCondition <- base::local({ [15:31:55.827] sendCondition <- NULL [15:31:55.827] function(frame = 1L) { [15:31:55.827] if (is.function(sendCondition)) [15:31:55.827] return(sendCondition) [15:31:55.827] ns <- getNamespace("parallel") [15:31:55.827] if (exists("sendData", mode = "function", [15:31:55.827] envir = ns)) { [15:31:55.827] parallel_sendData <- get("sendData", mode = "function", [15:31:55.827] envir = ns) [15:31:55.827] envir <- sys.frame(frame) [15:31:55.827] master <- NULL [15:31:55.827] while (!identical(envir, .GlobalEnv) && [15:31:55.827] !identical(envir, emptyenv())) { [15:31:55.827] if (exists("master", mode = "list", envir = envir, [15:31:55.827] inherits = FALSE)) { [15:31:55.827] master <- get("master", mode = "list", [15:31:55.827] envir = envir, inherits = FALSE) [15:31:55.827] if (inherits(master, c("SOCKnode", [15:31:55.827] "SOCK0node"))) { [15:31:55.827] sendCondition <<- function(cond) { [15:31:55.827] data <- list(type = "VALUE", value = cond, [15:31:55.827] success = TRUE) [15:31:55.827] parallel_sendData(master, data) [15:31:55.827] } [15:31:55.827] return(sendCondition) [15:31:55.827] } [15:31:55.827] } [15:31:55.827] frame <- frame + 1L [15:31:55.827] envir <- sys.frame(frame) [15:31:55.827] } [15:31:55.827] } [15:31:55.827] sendCondition <<- function(cond) NULL [15:31:55.827] } [15:31:55.827] }) [15:31:55.827] withCallingHandlers({ [15:31:55.827] { [15:31:55.827] do.call(function(...) { [15:31:55.827] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:55.827] if (!identical(...future.globals.maxSize.org, [15:31:55.827] ...future.globals.maxSize)) { [15:31:55.827] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:55.827] on.exit(options(oopts), add = TRUE) [15:31:55.827] } [15:31:55.827] { [15:31:55.827] lapply(seq_along(...future.elements_ii), [15:31:55.827] FUN = function(jj) { [15:31:55.827] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:55.827] ...future.FUN(...future.X_jj, ...) [15:31:55.827] }) [15:31:55.827] } [15:31:55.827] }, args = future.call.arguments) [15:31:55.827] } [15:31:55.827] }, immediateCondition = function(cond) { [15:31:55.827] sendCondition <- ...future.makeSendCondition() [15:31:55.827] sendCondition(cond) [15:31:55.827] muffleCondition <- function (cond, pattern = "^muffle") [15:31:55.827] { [15:31:55.827] inherits <- base::inherits [15:31:55.827] invokeRestart <- base::invokeRestart [15:31:55.827] is.null <- base::is.null [15:31:55.827] muffled <- FALSE [15:31:55.827] if (inherits(cond, "message")) { [15:31:55.827] muffled <- grepl(pattern, "muffleMessage") [15:31:55.827] if (muffled) [15:31:55.827] invokeRestart("muffleMessage") [15:31:55.827] } [15:31:55.827] else if (inherits(cond, "warning")) { [15:31:55.827] muffled <- grepl(pattern, "muffleWarning") [15:31:55.827] if (muffled) [15:31:55.827] invokeRestart("muffleWarning") [15:31:55.827] } [15:31:55.827] else if (inherits(cond, "condition")) { [15:31:55.827] if (!is.null(pattern)) { [15:31:55.827] computeRestarts <- base::computeRestarts [15:31:55.827] grepl <- base::grepl [15:31:55.827] restarts <- computeRestarts(cond) [15:31:55.827] for (restart in restarts) { [15:31:55.827] name <- restart$name [15:31:55.827] if (is.null(name)) [15:31:55.827] next [15:31:55.827] if (!grepl(pattern, name)) [15:31:55.827] next [15:31:55.827] invokeRestart(restart) [15:31:55.827] muffled <- TRUE [15:31:55.827] break [15:31:55.827] } [15:31:55.827] } [15:31:55.827] } [15:31:55.827] invisible(muffled) [15:31:55.827] } [15:31:55.827] muffleCondition(cond) [15:31:55.827] }) [15:31:55.827] })) [15:31:55.827] future::FutureResult(value = ...future.value$value, [15:31:55.827] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:55.827] ...future.rng), globalenv = if (FALSE) [15:31:55.827] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:55.827] ...future.globalenv.names)) [15:31:55.827] else NULL, started = ...future.startTime, version = "1.8") [15:31:55.827] }, condition = base::local({ [15:31:55.827] c <- base::c [15:31:55.827] inherits <- base::inherits [15:31:55.827] invokeRestart <- base::invokeRestart [15:31:55.827] length <- base::length [15:31:55.827] list <- base::list [15:31:55.827] seq.int <- base::seq.int [15:31:55.827] signalCondition <- base::signalCondition [15:31:55.827] sys.calls <- base::sys.calls [15:31:55.827] `[[` <- base::`[[` [15:31:55.827] `+` <- base::`+` [15:31:55.827] `<<-` <- base::`<<-` [15:31:55.827] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:55.827] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:55.827] 3L)] [15:31:55.827] } [15:31:55.827] function(cond) { [15:31:55.827] is_error <- inherits(cond, "error") [15:31:55.827] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:55.827] NULL) [15:31:55.827] if (is_error) { [15:31:55.827] sessionInformation <- function() { [15:31:55.827] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:55.827] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:55.827] search = base::search(), system = base::Sys.info()) [15:31:55.827] } [15:31:55.827] ...future.conditions[[length(...future.conditions) + [15:31:55.827] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:55.827] cond$call), session = sessionInformation(), [15:31:55.827] timestamp = base::Sys.time(), signaled = 0L) [15:31:55.827] signalCondition(cond) [15:31:55.827] } [15:31:55.827] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:55.827] "immediateCondition"))) { [15:31:55.827] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:55.827] ...future.conditions[[length(...future.conditions) + [15:31:55.827] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:55.827] if (TRUE && !signal) { [15:31:55.827] muffleCondition <- function (cond, pattern = "^muffle") [15:31:55.827] { [15:31:55.827] inherits <- base::inherits [15:31:55.827] invokeRestart <- base::invokeRestart [15:31:55.827] is.null <- base::is.null [15:31:55.827] muffled <- FALSE [15:31:55.827] if (inherits(cond, "message")) { [15:31:55.827] muffled <- grepl(pattern, "muffleMessage") [15:31:55.827] if (muffled) [15:31:55.827] invokeRestart("muffleMessage") [15:31:55.827] } [15:31:55.827] else if (inherits(cond, "warning")) { [15:31:55.827] muffled <- grepl(pattern, "muffleWarning") [15:31:55.827] if (muffled) [15:31:55.827] invokeRestart("muffleWarning") [15:31:55.827] } [15:31:55.827] else if (inherits(cond, "condition")) { [15:31:55.827] if (!is.null(pattern)) { [15:31:55.827] computeRestarts <- base::computeRestarts [15:31:55.827] grepl <- base::grepl [15:31:55.827] restarts <- computeRestarts(cond) [15:31:55.827] for (restart in restarts) { [15:31:55.827] name <- restart$name [15:31:55.827] if (is.null(name)) [15:31:55.827] next [15:31:55.827] if (!grepl(pattern, name)) [15:31:55.827] next [15:31:55.827] invokeRestart(restart) [15:31:55.827] muffled <- TRUE [15:31:55.827] break [15:31:55.827] } [15:31:55.827] } [15:31:55.827] } [15:31:55.827] invisible(muffled) [15:31:55.827] } [15:31:55.827] muffleCondition(cond, pattern = "^muffle") [15:31:55.827] } [15:31:55.827] } [15:31:55.827] else { [15:31:55.827] if (TRUE) { [15:31:55.827] muffleCondition <- function (cond, pattern = "^muffle") [15:31:55.827] { [15:31:55.827] inherits <- base::inherits [15:31:55.827] invokeRestart <- base::invokeRestart [15:31:55.827] is.null <- base::is.null [15:31:55.827] muffled <- FALSE [15:31:55.827] if (inherits(cond, "message")) { [15:31:55.827] muffled <- grepl(pattern, "muffleMessage") [15:31:55.827] if (muffled) [15:31:55.827] invokeRestart("muffleMessage") [15:31:55.827] } [15:31:55.827] else if (inherits(cond, "warning")) { [15:31:55.827] muffled <- grepl(pattern, "muffleWarning") [15:31:55.827] if (muffled) [15:31:55.827] invokeRestart("muffleWarning") [15:31:55.827] } [15:31:55.827] else if (inherits(cond, "condition")) { [15:31:55.827] if (!is.null(pattern)) { [15:31:55.827] computeRestarts <- base::computeRestarts [15:31:55.827] grepl <- base::grepl [15:31:55.827] restarts <- computeRestarts(cond) [15:31:55.827] for (restart in restarts) { [15:31:55.827] name <- restart$name [15:31:55.827] if (is.null(name)) [15:31:55.827] next [15:31:55.827] if (!grepl(pattern, name)) [15:31:55.827] next [15:31:55.827] invokeRestart(restart) [15:31:55.827] muffled <- TRUE [15:31:55.827] break [15:31:55.827] } [15:31:55.827] } [15:31:55.827] } [15:31:55.827] invisible(muffled) [15:31:55.827] } [15:31:55.827] muffleCondition(cond, pattern = "^muffle") [15:31:55.827] } [15:31:55.827] } [15:31:55.827] } [15:31:55.827] })) [15:31:55.827] }, error = function(ex) { [15:31:55.827] base::structure(base::list(value = NULL, visible = NULL, [15:31:55.827] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:55.827] ...future.rng), started = ...future.startTime, [15:31:55.827] finished = Sys.time(), session_uuid = NA_character_, [15:31:55.827] version = "1.8"), class = "FutureResult") [15:31:55.827] }, finally = { [15:31:55.827] if (!identical(...future.workdir, getwd())) [15:31:55.827] setwd(...future.workdir) [15:31:55.827] { [15:31:55.827] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:55.827] ...future.oldOptions$nwarnings <- NULL [15:31:55.827] } [15:31:55.827] base::options(...future.oldOptions) [15:31:55.827] if (.Platform$OS.type == "windows") { [15:31:55.827] old_names <- names(...future.oldEnvVars) [15:31:55.827] envs <- base::Sys.getenv() [15:31:55.827] names <- names(envs) [15:31:55.827] common <- intersect(names, old_names) [15:31:55.827] added <- setdiff(names, old_names) [15:31:55.827] removed <- setdiff(old_names, names) [15:31:55.827] changed <- common[...future.oldEnvVars[common] != [15:31:55.827] envs[common]] [15:31:55.827] NAMES <- toupper(changed) [15:31:55.827] args <- list() [15:31:55.827] for (kk in seq_along(NAMES)) { [15:31:55.827] name <- changed[[kk]] [15:31:55.827] NAME <- NAMES[[kk]] [15:31:55.827] if (name != NAME && is.element(NAME, old_names)) [15:31:55.827] next [15:31:55.827] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:55.827] } [15:31:55.827] NAMES <- toupper(added) [15:31:55.827] for (kk in seq_along(NAMES)) { [15:31:55.827] name <- added[[kk]] [15:31:55.827] NAME <- NAMES[[kk]] [15:31:55.827] if (name != NAME && is.element(NAME, old_names)) [15:31:55.827] next [15:31:55.827] args[[name]] <- "" [15:31:55.827] } [15:31:55.827] NAMES <- toupper(removed) [15:31:55.827] for (kk in seq_along(NAMES)) { [15:31:55.827] name <- removed[[kk]] [15:31:55.827] NAME <- NAMES[[kk]] [15:31:55.827] if (name != NAME && is.element(NAME, old_names)) [15:31:55.827] next [15:31:55.827] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:55.827] } [15:31:55.827] if (length(args) > 0) [15:31:55.827] base::do.call(base::Sys.setenv, args = args) [15:31:55.827] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:55.827] } [15:31:55.827] else { [15:31:55.827] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:55.827] } [15:31:55.827] { [15:31:55.827] if (base::length(...future.futureOptionsAdded) > [15:31:55.827] 0L) { [15:31:55.827] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:55.827] base::names(opts) <- ...future.futureOptionsAdded [15:31:55.827] base::options(opts) [15:31:55.827] } [15:31:55.827] { [15:31:55.827] { [15:31:55.827] base::options(mc.cores = ...future.mc.cores.old) [15:31:55.827] NULL [15:31:55.827] } [15:31:55.827] options(future.plan = NULL) [15:31:55.827] if (is.na(NA_character_)) [15:31:55.827] Sys.unsetenv("R_FUTURE_PLAN") [15:31:55.827] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:55.827] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:55.827] .init = FALSE) [15:31:55.827] } [15:31:55.827] } [15:31:55.827] } [15:31:55.827] }) [15:31:55.827] if (TRUE) { [15:31:55.827] base::sink(type = "output", split = FALSE) [15:31:55.827] if (TRUE) { [15:31:55.827] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:55.827] } [15:31:55.827] else { [15:31:55.827] ...future.result["stdout"] <- base::list(NULL) [15:31:55.827] } [15:31:55.827] base::close(...future.stdout) [15:31:55.827] ...future.stdout <- NULL [15:31:55.827] } [15:31:55.827] ...future.result$conditions <- ...future.conditions [15:31:55.827] ...future.result$finished <- base::Sys.time() [15:31:55.827] ...future.result [15:31:55.827] } [15:31:55.837] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:55.837] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:55.838] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:55.838] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:55.839] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:55.840] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [15:31:55.840] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [15:31:55.841] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:55.841] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:55.842] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:55.842] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:55.843] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:55.844] MultisessionFuture started [15:31:55.844] - Launch lazy future ... done [15:31:55.845] run() for 'MultisessionFuture' ... done [15:31:55.845] Created future: [15:31:55.871] receiveMessageFromWorker() for ClusterFuture ... [15:31:55.871] - Validating connection of MultisessionFuture [15:31:55.872] - received message: FutureResult [15:31:55.872] - Received FutureResult [15:31:55.872] - Erased future from FutureRegistry [15:31:55.873] result() for ClusterFuture ... [15:31:55.873] - result already collected: FutureResult [15:31:55.873] result() for ClusterFuture ... done [15:31:55.873] receiveMessageFromWorker() for ClusterFuture ... done [15:31:55.845] MultisessionFuture: [15:31:55.845] Label: 'future_lapply-1' [15:31:55.845] Expression: [15:31:55.845] { [15:31:55.845] do.call(function(...) { [15:31:55.845] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:55.845] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:55.845] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:55.845] on.exit(options(oopts), add = TRUE) [15:31:55.845] } [15:31:55.845] { [15:31:55.845] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:55.845] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:55.845] ...future.FUN(...future.X_jj, ...) [15:31:55.845] }) [15:31:55.845] } [15:31:55.845] }, args = future.call.arguments) [15:31:55.845] } [15:31:55.845] Lazy evaluation: FALSE [15:31:55.845] Asynchronous evaluation: TRUE [15:31:55.845] Local evaluation: TRUE [15:31:55.845] Environment: R_GlobalEnv [15:31:55.845] Capture standard output: TRUE [15:31:55.845] Capture condition classes: 'condition' (excluding 'nothing') [15:31:55.845] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:55.845] Packages: [15:31:55.845] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:55.845] Resolved: TRUE [15:31:55.845] Value: [15:31:55.845] Conditions captured: [15:31:55.845] Early signaling: FALSE [15:31:55.845] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:55.845] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:55.874] Chunk #1 of 4 ... DONE [15:31:55.875] Chunk #2 of 4 ... [15:31:55.875] - Finding globals in 'X' for chunk #2 ... [15:31:55.875] getGlobalsAndPackages() ... [15:31:55.876] Searching for globals... [15:31:55.876] [15:31:55.876] Searching for globals ... DONE [15:31:55.877] - globals: [0] [15:31:55.877] getGlobalsAndPackages() ... DONE [15:31:55.877] + additional globals found: [n=0] [15:31:55.878] + additional namespaces needed: [n=0] [15:31:55.878] - Finding globals in 'X' for chunk #2 ... DONE [15:31:55.878] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:55.879] - seeds: [15:31:55.879] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:55.879] getGlobalsAndPackages() ... [15:31:55.880] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:55.880] Resolving globals: FALSE [15:31:55.880] Tweak future expression to call with '...' arguments ... [15:31:55.881] { [15:31:55.881] do.call(function(...) { [15:31:55.881] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:55.881] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:55.881] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:55.881] on.exit(options(oopts), add = TRUE) [15:31:55.881] } [15:31:55.881] { [15:31:55.881] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:55.881] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:55.881] ...future.FUN(...future.X_jj, ...) [15:31:55.881] }) [15:31:55.881] } [15:31:55.881] }, args = future.call.arguments) [15:31:55.881] } [15:31:55.881] Tweak future expression to call with '...' arguments ... DONE [15:31:55.882] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:55.883] [15:31:55.883] getGlobalsAndPackages() ... DONE [15:31:55.884] run() for 'Future' ... [15:31:55.884] - state: 'created' [15:31:55.885] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:55.904] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:55.904] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:55.905] - Field: 'node' [15:31:55.905] - Field: 'label' [15:31:55.905] - Field: 'local' [15:31:55.905] - Field: 'owner' [15:31:55.906] - Field: 'envir' [15:31:55.906] - Field: 'workers' [15:31:55.906] - Field: 'packages' [15:31:55.906] - Field: 'gc' [15:31:55.906] - Field: 'conditions' [15:31:55.907] - Field: 'persistent' [15:31:55.907] - Field: 'expr' [15:31:55.907] - Field: 'uuid' [15:31:55.907] - Field: 'seed' [15:31:55.907] - Field: 'version' [15:31:55.908] - Field: 'result' [15:31:55.908] - Field: 'asynchronous' [15:31:55.908] - Field: 'calls' [15:31:55.908] - Field: 'globals' [15:31:55.908] - Field: 'stdout' [15:31:55.909] - Field: 'earlySignal' [15:31:55.909] - Field: 'lazy' [15:31:55.909] - Field: 'state' [15:31:55.909] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:55.910] - Launch lazy future ... [15:31:55.910] Packages needed by the future expression (n = 0): [15:31:55.910] Packages needed by future strategies (n = 0): [15:31:55.911] { [15:31:55.911] { [15:31:55.911] { [15:31:55.911] ...future.startTime <- base::Sys.time() [15:31:55.911] { [15:31:55.911] { [15:31:55.911] { [15:31:55.911] { [15:31:55.911] base::local({ [15:31:55.911] has_future <- base::requireNamespace("future", [15:31:55.911] quietly = TRUE) [15:31:55.911] if (has_future) { [15:31:55.911] ns <- base::getNamespace("future") [15:31:55.911] version <- ns[[".package"]][["version"]] [15:31:55.911] if (is.null(version)) [15:31:55.911] version <- utils::packageVersion("future") [15:31:55.911] } [15:31:55.911] else { [15:31:55.911] version <- NULL [15:31:55.911] } [15:31:55.911] if (!has_future || version < "1.8.0") { [15:31:55.911] info <- base::c(r_version = base::gsub("R version ", [15:31:55.911] "", base::R.version$version.string), [15:31:55.911] platform = base::sprintf("%s (%s-bit)", [15:31:55.911] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:55.911] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:55.911] "release", "version")], collapse = " "), [15:31:55.911] hostname = base::Sys.info()[["nodename"]]) [15:31:55.911] info <- base::sprintf("%s: %s", base::names(info), [15:31:55.911] info) [15:31:55.911] info <- base::paste(info, collapse = "; ") [15:31:55.911] if (!has_future) { [15:31:55.911] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:55.911] info) [15:31:55.911] } [15:31:55.911] else { [15:31:55.911] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:55.911] info, version) [15:31:55.911] } [15:31:55.911] base::stop(msg) [15:31:55.911] } [15:31:55.911] }) [15:31:55.911] } [15:31:55.911] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:55.911] base::options(mc.cores = 1L) [15:31:55.911] } [15:31:55.911] ...future.strategy.old <- future::plan("list") [15:31:55.911] options(future.plan = NULL) [15:31:55.911] Sys.unsetenv("R_FUTURE_PLAN") [15:31:55.911] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:55.911] } [15:31:55.911] ...future.workdir <- getwd() [15:31:55.911] } [15:31:55.911] ...future.oldOptions <- base::as.list(base::.Options) [15:31:55.911] ...future.oldEnvVars <- base::Sys.getenv() [15:31:55.911] } [15:31:55.911] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:55.911] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:55.911] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:55.911] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:55.911] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:55.911] future.stdout.windows.reencode = NULL, width = 80L) [15:31:55.911] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:55.911] base::names(...future.oldOptions)) [15:31:55.911] } [15:31:55.911] if (FALSE) { [15:31:55.911] } [15:31:55.911] else { [15:31:55.911] if (TRUE) { [15:31:55.911] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:55.911] open = "w") [15:31:55.911] } [15:31:55.911] else { [15:31:55.911] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:55.911] windows = "NUL", "/dev/null"), open = "w") [15:31:55.911] } [15:31:55.911] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:55.911] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:55.911] base::sink(type = "output", split = FALSE) [15:31:55.911] base::close(...future.stdout) [15:31:55.911] }, add = TRUE) [15:31:55.911] } [15:31:55.911] ...future.frame <- base::sys.nframe() [15:31:55.911] ...future.conditions <- base::list() [15:31:55.911] ...future.rng <- base::globalenv()$.Random.seed [15:31:55.911] if (FALSE) { [15:31:55.911] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:55.911] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:55.911] } [15:31:55.911] ...future.result <- base::tryCatch({ [15:31:55.911] base::withCallingHandlers({ [15:31:55.911] ...future.value <- base::withVisible(base::local({ [15:31:55.911] ...future.makeSendCondition <- base::local({ [15:31:55.911] sendCondition <- NULL [15:31:55.911] function(frame = 1L) { [15:31:55.911] if (is.function(sendCondition)) [15:31:55.911] return(sendCondition) [15:31:55.911] ns <- getNamespace("parallel") [15:31:55.911] if (exists("sendData", mode = "function", [15:31:55.911] envir = ns)) { [15:31:55.911] parallel_sendData <- get("sendData", mode = "function", [15:31:55.911] envir = ns) [15:31:55.911] envir <- sys.frame(frame) [15:31:55.911] master <- NULL [15:31:55.911] while (!identical(envir, .GlobalEnv) && [15:31:55.911] !identical(envir, emptyenv())) { [15:31:55.911] if (exists("master", mode = "list", envir = envir, [15:31:55.911] inherits = FALSE)) { [15:31:55.911] master <- get("master", mode = "list", [15:31:55.911] envir = envir, inherits = FALSE) [15:31:55.911] if (inherits(master, c("SOCKnode", [15:31:55.911] "SOCK0node"))) { [15:31:55.911] sendCondition <<- function(cond) { [15:31:55.911] data <- list(type = "VALUE", value = cond, [15:31:55.911] success = TRUE) [15:31:55.911] parallel_sendData(master, data) [15:31:55.911] } [15:31:55.911] return(sendCondition) [15:31:55.911] } [15:31:55.911] } [15:31:55.911] frame <- frame + 1L [15:31:55.911] envir <- sys.frame(frame) [15:31:55.911] } [15:31:55.911] } [15:31:55.911] sendCondition <<- function(cond) NULL [15:31:55.911] } [15:31:55.911] }) [15:31:55.911] withCallingHandlers({ [15:31:55.911] { [15:31:55.911] do.call(function(...) { [15:31:55.911] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:55.911] if (!identical(...future.globals.maxSize.org, [15:31:55.911] ...future.globals.maxSize)) { [15:31:55.911] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:55.911] on.exit(options(oopts), add = TRUE) [15:31:55.911] } [15:31:55.911] { [15:31:55.911] lapply(seq_along(...future.elements_ii), [15:31:55.911] FUN = function(jj) { [15:31:55.911] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:55.911] ...future.FUN(...future.X_jj, ...) [15:31:55.911] }) [15:31:55.911] } [15:31:55.911] }, args = future.call.arguments) [15:31:55.911] } [15:31:55.911] }, immediateCondition = function(cond) { [15:31:55.911] sendCondition <- ...future.makeSendCondition() [15:31:55.911] sendCondition(cond) [15:31:55.911] muffleCondition <- function (cond, pattern = "^muffle") [15:31:55.911] { [15:31:55.911] inherits <- base::inherits [15:31:55.911] invokeRestart <- base::invokeRestart [15:31:55.911] is.null <- base::is.null [15:31:55.911] muffled <- FALSE [15:31:55.911] if (inherits(cond, "message")) { [15:31:55.911] muffled <- grepl(pattern, "muffleMessage") [15:31:55.911] if (muffled) [15:31:55.911] invokeRestart("muffleMessage") [15:31:55.911] } [15:31:55.911] else if (inherits(cond, "warning")) { [15:31:55.911] muffled <- grepl(pattern, "muffleWarning") [15:31:55.911] if (muffled) [15:31:55.911] invokeRestart("muffleWarning") [15:31:55.911] } [15:31:55.911] else if (inherits(cond, "condition")) { [15:31:55.911] if (!is.null(pattern)) { [15:31:55.911] computeRestarts <- base::computeRestarts [15:31:55.911] grepl <- base::grepl [15:31:55.911] restarts <- computeRestarts(cond) [15:31:55.911] for (restart in restarts) { [15:31:55.911] name <- restart$name [15:31:55.911] if (is.null(name)) [15:31:55.911] next [15:31:55.911] if (!grepl(pattern, name)) [15:31:55.911] next [15:31:55.911] invokeRestart(restart) [15:31:55.911] muffled <- TRUE [15:31:55.911] break [15:31:55.911] } [15:31:55.911] } [15:31:55.911] } [15:31:55.911] invisible(muffled) [15:31:55.911] } [15:31:55.911] muffleCondition(cond) [15:31:55.911] }) [15:31:55.911] })) [15:31:55.911] future::FutureResult(value = ...future.value$value, [15:31:55.911] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:55.911] ...future.rng), globalenv = if (FALSE) [15:31:55.911] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:55.911] ...future.globalenv.names)) [15:31:55.911] else NULL, started = ...future.startTime, version = "1.8") [15:31:55.911] }, condition = base::local({ [15:31:55.911] c <- base::c [15:31:55.911] inherits <- base::inherits [15:31:55.911] invokeRestart <- base::invokeRestart [15:31:55.911] length <- base::length [15:31:55.911] list <- base::list [15:31:55.911] seq.int <- base::seq.int [15:31:55.911] signalCondition <- base::signalCondition [15:31:55.911] sys.calls <- base::sys.calls [15:31:55.911] `[[` <- base::`[[` [15:31:55.911] `+` <- base::`+` [15:31:55.911] `<<-` <- base::`<<-` [15:31:55.911] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:55.911] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:55.911] 3L)] [15:31:55.911] } [15:31:55.911] function(cond) { [15:31:55.911] is_error <- inherits(cond, "error") [15:31:55.911] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:55.911] NULL) [15:31:55.911] if (is_error) { [15:31:55.911] sessionInformation <- function() { [15:31:55.911] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:55.911] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:55.911] search = base::search(), system = base::Sys.info()) [15:31:55.911] } [15:31:55.911] ...future.conditions[[length(...future.conditions) + [15:31:55.911] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:55.911] cond$call), session = sessionInformation(), [15:31:55.911] timestamp = base::Sys.time(), signaled = 0L) [15:31:55.911] signalCondition(cond) [15:31:55.911] } [15:31:55.911] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:55.911] "immediateCondition"))) { [15:31:55.911] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:55.911] ...future.conditions[[length(...future.conditions) + [15:31:55.911] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:55.911] if (TRUE && !signal) { [15:31:55.911] muffleCondition <- function (cond, pattern = "^muffle") [15:31:55.911] { [15:31:55.911] inherits <- base::inherits [15:31:55.911] invokeRestart <- base::invokeRestart [15:31:55.911] is.null <- base::is.null [15:31:55.911] muffled <- FALSE [15:31:55.911] if (inherits(cond, "message")) { [15:31:55.911] muffled <- grepl(pattern, "muffleMessage") [15:31:55.911] if (muffled) [15:31:55.911] invokeRestart("muffleMessage") [15:31:55.911] } [15:31:55.911] else if (inherits(cond, "warning")) { [15:31:55.911] muffled <- grepl(pattern, "muffleWarning") [15:31:55.911] if (muffled) [15:31:55.911] invokeRestart("muffleWarning") [15:31:55.911] } [15:31:55.911] else if (inherits(cond, "condition")) { [15:31:55.911] if (!is.null(pattern)) { [15:31:55.911] computeRestarts <- base::computeRestarts [15:31:55.911] grepl <- base::grepl [15:31:55.911] restarts <- computeRestarts(cond) [15:31:55.911] for (restart in restarts) { [15:31:55.911] name <- restart$name [15:31:55.911] if (is.null(name)) [15:31:55.911] next [15:31:55.911] if (!grepl(pattern, name)) [15:31:55.911] next [15:31:55.911] invokeRestart(restart) [15:31:55.911] muffled <- TRUE [15:31:55.911] break [15:31:55.911] } [15:31:55.911] } [15:31:55.911] } [15:31:55.911] invisible(muffled) [15:31:55.911] } [15:31:55.911] muffleCondition(cond, pattern = "^muffle") [15:31:55.911] } [15:31:55.911] } [15:31:55.911] else { [15:31:55.911] if (TRUE) { [15:31:55.911] muffleCondition <- function (cond, pattern = "^muffle") [15:31:55.911] { [15:31:55.911] inherits <- base::inherits [15:31:55.911] invokeRestart <- base::invokeRestart [15:31:55.911] is.null <- base::is.null [15:31:55.911] muffled <- FALSE [15:31:55.911] if (inherits(cond, "message")) { [15:31:55.911] muffled <- grepl(pattern, "muffleMessage") [15:31:55.911] if (muffled) [15:31:55.911] invokeRestart("muffleMessage") [15:31:55.911] } [15:31:55.911] else if (inherits(cond, "warning")) { [15:31:55.911] muffled <- grepl(pattern, "muffleWarning") [15:31:55.911] if (muffled) [15:31:55.911] invokeRestart("muffleWarning") [15:31:55.911] } [15:31:55.911] else if (inherits(cond, "condition")) { [15:31:55.911] if (!is.null(pattern)) { [15:31:55.911] computeRestarts <- base::computeRestarts [15:31:55.911] grepl <- base::grepl [15:31:55.911] restarts <- computeRestarts(cond) [15:31:55.911] for (restart in restarts) { [15:31:55.911] name <- restart$name [15:31:55.911] if (is.null(name)) [15:31:55.911] next [15:31:55.911] if (!grepl(pattern, name)) [15:31:55.911] next [15:31:55.911] invokeRestart(restart) [15:31:55.911] muffled <- TRUE [15:31:55.911] break [15:31:55.911] } [15:31:55.911] } [15:31:55.911] } [15:31:55.911] invisible(muffled) [15:31:55.911] } [15:31:55.911] muffleCondition(cond, pattern = "^muffle") [15:31:55.911] } [15:31:55.911] } [15:31:55.911] } [15:31:55.911] })) [15:31:55.911] }, error = function(ex) { [15:31:55.911] base::structure(base::list(value = NULL, visible = NULL, [15:31:55.911] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:55.911] ...future.rng), started = ...future.startTime, [15:31:55.911] finished = Sys.time(), session_uuid = NA_character_, [15:31:55.911] version = "1.8"), class = "FutureResult") [15:31:55.911] }, finally = { [15:31:55.911] if (!identical(...future.workdir, getwd())) [15:31:55.911] setwd(...future.workdir) [15:31:55.911] { [15:31:55.911] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:55.911] ...future.oldOptions$nwarnings <- NULL [15:31:55.911] } [15:31:55.911] base::options(...future.oldOptions) [15:31:55.911] if (.Platform$OS.type == "windows") { [15:31:55.911] old_names <- names(...future.oldEnvVars) [15:31:55.911] envs <- base::Sys.getenv() [15:31:55.911] names <- names(envs) [15:31:55.911] common <- intersect(names, old_names) [15:31:55.911] added <- setdiff(names, old_names) [15:31:55.911] removed <- setdiff(old_names, names) [15:31:55.911] changed <- common[...future.oldEnvVars[common] != [15:31:55.911] envs[common]] [15:31:55.911] NAMES <- toupper(changed) [15:31:55.911] args <- list() [15:31:55.911] for (kk in seq_along(NAMES)) { [15:31:55.911] name <- changed[[kk]] [15:31:55.911] NAME <- NAMES[[kk]] [15:31:55.911] if (name != NAME && is.element(NAME, old_names)) [15:31:55.911] next [15:31:55.911] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:55.911] } [15:31:55.911] NAMES <- toupper(added) [15:31:55.911] for (kk in seq_along(NAMES)) { [15:31:55.911] name <- added[[kk]] [15:31:55.911] NAME <- NAMES[[kk]] [15:31:55.911] if (name != NAME && is.element(NAME, old_names)) [15:31:55.911] next [15:31:55.911] args[[name]] <- "" [15:31:55.911] } [15:31:55.911] NAMES <- toupper(removed) [15:31:55.911] for (kk in seq_along(NAMES)) { [15:31:55.911] name <- removed[[kk]] [15:31:55.911] NAME <- NAMES[[kk]] [15:31:55.911] if (name != NAME && is.element(NAME, old_names)) [15:31:55.911] next [15:31:55.911] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:55.911] } [15:31:55.911] if (length(args) > 0) [15:31:55.911] base::do.call(base::Sys.setenv, args = args) [15:31:55.911] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:55.911] } [15:31:55.911] else { [15:31:55.911] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:55.911] } [15:31:55.911] { [15:31:55.911] if (base::length(...future.futureOptionsAdded) > [15:31:55.911] 0L) { [15:31:55.911] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:55.911] base::names(opts) <- ...future.futureOptionsAdded [15:31:55.911] base::options(opts) [15:31:55.911] } [15:31:55.911] { [15:31:55.911] { [15:31:55.911] base::options(mc.cores = ...future.mc.cores.old) [15:31:55.911] NULL [15:31:55.911] } [15:31:55.911] options(future.plan = NULL) [15:31:55.911] if (is.na(NA_character_)) [15:31:55.911] Sys.unsetenv("R_FUTURE_PLAN") [15:31:55.911] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:55.911] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:55.911] .init = FALSE) [15:31:55.911] } [15:31:55.911] } [15:31:55.911] } [15:31:55.911] }) [15:31:55.911] if (TRUE) { [15:31:55.911] base::sink(type = "output", split = FALSE) [15:31:55.911] if (TRUE) { [15:31:55.911] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:55.911] } [15:31:55.911] else { [15:31:55.911] ...future.result["stdout"] <- base::list(NULL) [15:31:55.911] } [15:31:55.911] base::close(...future.stdout) [15:31:55.911] ...future.stdout <- NULL [15:31:55.911] } [15:31:55.911] ...future.result$conditions <- ...future.conditions [15:31:55.911] ...future.result$finished <- base::Sys.time() [15:31:55.911] ...future.result [15:31:55.911] } [15:31:55.917] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:55.918] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:55.918] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:55.919] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:55.919] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:55.919] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [15:31:55.920] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [15:31:55.920] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:55.923] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:55.923] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:55.924] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:55.924] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:55.925] MultisessionFuture started [15:31:55.925] - Launch lazy future ... done [15:31:55.925] run() for 'MultisessionFuture' ... done [15:31:55.925] Created future: [15:31:55.949] receiveMessageFromWorker() for ClusterFuture ... [15:31:55.949] - Validating connection of MultisessionFuture [15:31:55.950] - received message: FutureResult [15:31:55.950] - Received FutureResult [15:31:55.950] - Erased future from FutureRegistry [15:31:55.950] result() for ClusterFuture ... [15:31:55.951] - result already collected: FutureResult [15:31:55.951] result() for ClusterFuture ... done [15:31:55.951] receiveMessageFromWorker() for ClusterFuture ... done [15:31:55.925] MultisessionFuture: [15:31:55.925] Label: 'future_lapply-2' [15:31:55.925] Expression: [15:31:55.925] { [15:31:55.925] do.call(function(...) { [15:31:55.925] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:55.925] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:55.925] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:55.925] on.exit(options(oopts), add = TRUE) [15:31:55.925] } [15:31:55.925] { [15:31:55.925] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:55.925] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:55.925] ...future.FUN(...future.X_jj, ...) [15:31:55.925] }) [15:31:55.925] } [15:31:55.925] }, args = future.call.arguments) [15:31:55.925] } [15:31:55.925] Lazy evaluation: FALSE [15:31:55.925] Asynchronous evaluation: TRUE [15:31:55.925] Local evaluation: TRUE [15:31:55.925] Environment: R_GlobalEnv [15:31:55.925] Capture standard output: TRUE [15:31:55.925] Capture condition classes: 'condition' (excluding 'nothing') [15:31:55.925] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:55.925] Packages: [15:31:55.925] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:55.925] Resolved: TRUE [15:31:55.925] Value: [15:31:55.925] Conditions captured: [15:31:55.925] Early signaling: FALSE [15:31:55.925] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:55.925] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:55.952] Chunk #2 of 4 ... DONE [15:31:55.952] Chunk #3 of 4 ... [15:31:55.952] - Finding globals in 'X' for chunk #3 ... [15:31:55.952] getGlobalsAndPackages() ... [15:31:55.953] Searching for globals... [15:31:55.953] [15:31:55.953] Searching for globals ... DONE [15:31:55.954] - globals: [0] [15:31:55.954] getGlobalsAndPackages() ... DONE [15:31:55.954] + additional globals found: [n=0] [15:31:55.954] + additional namespaces needed: [n=0] [15:31:55.955] - Finding globals in 'X' for chunk #3 ... DONE [15:31:55.955] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:55.955] - seeds: [15:31:55.956] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:55.956] getGlobalsAndPackages() ... [15:31:55.956] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:55.956] Resolving globals: FALSE [15:31:55.957] Tweak future expression to call with '...' arguments ... [15:31:55.957] { [15:31:55.957] do.call(function(...) { [15:31:55.957] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:55.957] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:55.957] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:55.957] on.exit(options(oopts), add = TRUE) [15:31:55.957] } [15:31:55.957] { [15:31:55.957] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:55.957] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:55.957] ...future.FUN(...future.X_jj, ...) [15:31:55.957] }) [15:31:55.957] } [15:31:55.957] }, args = future.call.arguments) [15:31:55.957] } [15:31:55.958] Tweak future expression to call with '...' arguments ... DONE [15:31:55.959] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:55.959] [15:31:55.959] getGlobalsAndPackages() ... DONE [15:31:55.960] run() for 'Future' ... [15:31:55.960] - state: 'created' [15:31:55.960] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:55.978] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:55.978] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:55.979] - Field: 'node' [15:31:55.979] - Field: 'label' [15:31:55.979] - Field: 'local' [15:31:55.980] - Field: 'owner' [15:31:55.980] - Field: 'envir' [15:31:55.980] - Field: 'workers' [15:31:55.981] - Field: 'packages' [15:31:55.981] - Field: 'gc' [15:31:55.981] - Field: 'conditions' [15:31:55.981] - Field: 'persistent' [15:31:55.982] - Field: 'expr' [15:31:55.982] - Field: 'uuid' [15:31:55.982] - Field: 'seed' [15:31:55.983] - Field: 'version' [15:31:55.983] - Field: 'result' [15:31:55.983] - Field: 'asynchronous' [15:31:55.983] - Field: 'calls' [15:31:55.984] - Field: 'globals' [15:31:55.984] - Field: 'stdout' [15:31:55.984] - Field: 'earlySignal' [15:31:55.985] - Field: 'lazy' [15:31:55.985] - Field: 'state' [15:31:55.985] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:55.985] - Launch lazy future ... [15:31:55.986] Packages needed by the future expression (n = 0): [15:31:55.986] Packages needed by future strategies (n = 0): [15:31:55.987] { [15:31:55.987] { [15:31:55.987] { [15:31:55.987] ...future.startTime <- base::Sys.time() [15:31:55.987] { [15:31:55.987] { [15:31:55.987] { [15:31:55.987] { [15:31:55.987] base::local({ [15:31:55.987] has_future <- base::requireNamespace("future", [15:31:55.987] quietly = TRUE) [15:31:55.987] if (has_future) { [15:31:55.987] ns <- base::getNamespace("future") [15:31:55.987] version <- ns[[".package"]][["version"]] [15:31:55.987] if (is.null(version)) [15:31:55.987] version <- utils::packageVersion("future") [15:31:55.987] } [15:31:55.987] else { [15:31:55.987] version <- NULL [15:31:55.987] } [15:31:55.987] if (!has_future || version < "1.8.0") { [15:31:55.987] info <- base::c(r_version = base::gsub("R version ", [15:31:55.987] "", base::R.version$version.string), [15:31:55.987] platform = base::sprintf("%s (%s-bit)", [15:31:55.987] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:55.987] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:55.987] "release", "version")], collapse = " "), [15:31:55.987] hostname = base::Sys.info()[["nodename"]]) [15:31:55.987] info <- base::sprintf("%s: %s", base::names(info), [15:31:55.987] info) [15:31:55.987] info <- base::paste(info, collapse = "; ") [15:31:55.987] if (!has_future) { [15:31:55.987] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:55.987] info) [15:31:55.987] } [15:31:55.987] else { [15:31:55.987] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:55.987] info, version) [15:31:55.987] } [15:31:55.987] base::stop(msg) [15:31:55.987] } [15:31:55.987] }) [15:31:55.987] } [15:31:55.987] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:55.987] base::options(mc.cores = 1L) [15:31:55.987] } [15:31:55.987] ...future.strategy.old <- future::plan("list") [15:31:55.987] options(future.plan = NULL) [15:31:55.987] Sys.unsetenv("R_FUTURE_PLAN") [15:31:55.987] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:55.987] } [15:31:55.987] ...future.workdir <- getwd() [15:31:55.987] } [15:31:55.987] ...future.oldOptions <- base::as.list(base::.Options) [15:31:55.987] ...future.oldEnvVars <- base::Sys.getenv() [15:31:55.987] } [15:31:55.987] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:55.987] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:55.987] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:55.987] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:55.987] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:55.987] future.stdout.windows.reencode = NULL, width = 80L) [15:31:55.987] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:55.987] base::names(...future.oldOptions)) [15:31:55.987] } [15:31:55.987] if (FALSE) { [15:31:55.987] } [15:31:55.987] else { [15:31:55.987] if (TRUE) { [15:31:55.987] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:55.987] open = "w") [15:31:55.987] } [15:31:55.987] else { [15:31:55.987] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:55.987] windows = "NUL", "/dev/null"), open = "w") [15:31:55.987] } [15:31:55.987] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:55.987] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:55.987] base::sink(type = "output", split = FALSE) [15:31:55.987] base::close(...future.stdout) [15:31:55.987] }, add = TRUE) [15:31:55.987] } [15:31:55.987] ...future.frame <- base::sys.nframe() [15:31:55.987] ...future.conditions <- base::list() [15:31:55.987] ...future.rng <- base::globalenv()$.Random.seed [15:31:55.987] if (FALSE) { [15:31:55.987] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:55.987] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:55.987] } [15:31:55.987] ...future.result <- base::tryCatch({ [15:31:55.987] base::withCallingHandlers({ [15:31:55.987] ...future.value <- base::withVisible(base::local({ [15:31:55.987] ...future.makeSendCondition <- base::local({ [15:31:55.987] sendCondition <- NULL [15:31:55.987] function(frame = 1L) { [15:31:55.987] if (is.function(sendCondition)) [15:31:55.987] return(sendCondition) [15:31:55.987] ns <- getNamespace("parallel") [15:31:55.987] if (exists("sendData", mode = "function", [15:31:55.987] envir = ns)) { [15:31:55.987] parallel_sendData <- get("sendData", mode = "function", [15:31:55.987] envir = ns) [15:31:55.987] envir <- sys.frame(frame) [15:31:55.987] master <- NULL [15:31:55.987] while (!identical(envir, .GlobalEnv) && [15:31:55.987] !identical(envir, emptyenv())) { [15:31:55.987] if (exists("master", mode = "list", envir = envir, [15:31:55.987] inherits = FALSE)) { [15:31:55.987] master <- get("master", mode = "list", [15:31:55.987] envir = envir, inherits = FALSE) [15:31:55.987] if (inherits(master, c("SOCKnode", [15:31:55.987] "SOCK0node"))) { [15:31:55.987] sendCondition <<- function(cond) { [15:31:55.987] data <- list(type = "VALUE", value = cond, [15:31:55.987] success = TRUE) [15:31:55.987] parallel_sendData(master, data) [15:31:55.987] } [15:31:55.987] return(sendCondition) [15:31:55.987] } [15:31:55.987] } [15:31:55.987] frame <- frame + 1L [15:31:55.987] envir <- sys.frame(frame) [15:31:55.987] } [15:31:55.987] } [15:31:55.987] sendCondition <<- function(cond) NULL [15:31:55.987] } [15:31:55.987] }) [15:31:55.987] withCallingHandlers({ [15:31:55.987] { [15:31:55.987] do.call(function(...) { [15:31:55.987] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:55.987] if (!identical(...future.globals.maxSize.org, [15:31:55.987] ...future.globals.maxSize)) { [15:31:55.987] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:55.987] on.exit(options(oopts), add = TRUE) [15:31:55.987] } [15:31:55.987] { [15:31:55.987] lapply(seq_along(...future.elements_ii), [15:31:55.987] FUN = function(jj) { [15:31:55.987] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:55.987] ...future.FUN(...future.X_jj, ...) [15:31:55.987] }) [15:31:55.987] } [15:31:55.987] }, args = future.call.arguments) [15:31:55.987] } [15:31:55.987] }, immediateCondition = function(cond) { [15:31:55.987] sendCondition <- ...future.makeSendCondition() [15:31:55.987] sendCondition(cond) [15:31:55.987] muffleCondition <- function (cond, pattern = "^muffle") [15:31:55.987] { [15:31:55.987] inherits <- base::inherits [15:31:55.987] invokeRestart <- base::invokeRestart [15:31:55.987] is.null <- base::is.null [15:31:55.987] muffled <- FALSE [15:31:55.987] if (inherits(cond, "message")) { [15:31:55.987] muffled <- grepl(pattern, "muffleMessage") [15:31:55.987] if (muffled) [15:31:55.987] invokeRestart("muffleMessage") [15:31:55.987] } [15:31:55.987] else if (inherits(cond, "warning")) { [15:31:55.987] muffled <- grepl(pattern, "muffleWarning") [15:31:55.987] if (muffled) [15:31:55.987] invokeRestart("muffleWarning") [15:31:55.987] } [15:31:55.987] else if (inherits(cond, "condition")) { [15:31:55.987] if (!is.null(pattern)) { [15:31:55.987] computeRestarts <- base::computeRestarts [15:31:55.987] grepl <- base::grepl [15:31:55.987] restarts <- computeRestarts(cond) [15:31:55.987] for (restart in restarts) { [15:31:55.987] name <- restart$name [15:31:55.987] if (is.null(name)) [15:31:55.987] next [15:31:55.987] if (!grepl(pattern, name)) [15:31:55.987] next [15:31:55.987] invokeRestart(restart) [15:31:55.987] muffled <- TRUE [15:31:55.987] break [15:31:55.987] } [15:31:55.987] } [15:31:55.987] } [15:31:55.987] invisible(muffled) [15:31:55.987] } [15:31:55.987] muffleCondition(cond) [15:31:55.987] }) [15:31:55.987] })) [15:31:55.987] future::FutureResult(value = ...future.value$value, [15:31:55.987] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:55.987] ...future.rng), globalenv = if (FALSE) [15:31:55.987] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:55.987] ...future.globalenv.names)) [15:31:55.987] else NULL, started = ...future.startTime, version = "1.8") [15:31:55.987] }, condition = base::local({ [15:31:55.987] c <- base::c [15:31:55.987] inherits <- base::inherits [15:31:55.987] invokeRestart <- base::invokeRestart [15:31:55.987] length <- base::length [15:31:55.987] list <- base::list [15:31:55.987] seq.int <- base::seq.int [15:31:55.987] signalCondition <- base::signalCondition [15:31:55.987] sys.calls <- base::sys.calls [15:31:55.987] `[[` <- base::`[[` [15:31:55.987] `+` <- base::`+` [15:31:55.987] `<<-` <- base::`<<-` [15:31:55.987] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:55.987] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:55.987] 3L)] [15:31:55.987] } [15:31:55.987] function(cond) { [15:31:55.987] is_error <- inherits(cond, "error") [15:31:55.987] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:55.987] NULL) [15:31:55.987] if (is_error) { [15:31:55.987] sessionInformation <- function() { [15:31:55.987] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:55.987] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:55.987] search = base::search(), system = base::Sys.info()) [15:31:55.987] } [15:31:55.987] ...future.conditions[[length(...future.conditions) + [15:31:55.987] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:55.987] cond$call), session = sessionInformation(), [15:31:55.987] timestamp = base::Sys.time(), signaled = 0L) [15:31:55.987] signalCondition(cond) [15:31:55.987] } [15:31:55.987] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:55.987] "immediateCondition"))) { [15:31:55.987] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:55.987] ...future.conditions[[length(...future.conditions) + [15:31:55.987] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:55.987] if (TRUE && !signal) { [15:31:55.987] muffleCondition <- function (cond, pattern = "^muffle") [15:31:55.987] { [15:31:55.987] inherits <- base::inherits [15:31:55.987] invokeRestart <- base::invokeRestart [15:31:55.987] is.null <- base::is.null [15:31:55.987] muffled <- FALSE [15:31:55.987] if (inherits(cond, "message")) { [15:31:55.987] muffled <- grepl(pattern, "muffleMessage") [15:31:55.987] if (muffled) [15:31:55.987] invokeRestart("muffleMessage") [15:31:55.987] } [15:31:55.987] else if (inherits(cond, "warning")) { [15:31:55.987] muffled <- grepl(pattern, "muffleWarning") [15:31:55.987] if (muffled) [15:31:55.987] invokeRestart("muffleWarning") [15:31:55.987] } [15:31:55.987] else if (inherits(cond, "condition")) { [15:31:55.987] if (!is.null(pattern)) { [15:31:55.987] computeRestarts <- base::computeRestarts [15:31:55.987] grepl <- base::grepl [15:31:55.987] restarts <- computeRestarts(cond) [15:31:55.987] for (restart in restarts) { [15:31:55.987] name <- restart$name [15:31:55.987] if (is.null(name)) [15:31:55.987] next [15:31:55.987] if (!grepl(pattern, name)) [15:31:55.987] next [15:31:55.987] invokeRestart(restart) [15:31:55.987] muffled <- TRUE [15:31:55.987] break [15:31:55.987] } [15:31:55.987] } [15:31:55.987] } [15:31:55.987] invisible(muffled) [15:31:55.987] } [15:31:55.987] muffleCondition(cond, pattern = "^muffle") [15:31:55.987] } [15:31:55.987] } [15:31:55.987] else { [15:31:55.987] if (TRUE) { [15:31:55.987] muffleCondition <- function (cond, pattern = "^muffle") [15:31:55.987] { [15:31:55.987] inherits <- base::inherits [15:31:55.987] invokeRestart <- base::invokeRestart [15:31:55.987] is.null <- base::is.null [15:31:55.987] muffled <- FALSE [15:31:55.987] if (inherits(cond, "message")) { [15:31:55.987] muffled <- grepl(pattern, "muffleMessage") [15:31:55.987] if (muffled) [15:31:55.987] invokeRestart("muffleMessage") [15:31:55.987] } [15:31:55.987] else if (inherits(cond, "warning")) { [15:31:55.987] muffled <- grepl(pattern, "muffleWarning") [15:31:55.987] if (muffled) [15:31:55.987] invokeRestart("muffleWarning") [15:31:55.987] } [15:31:55.987] else if (inherits(cond, "condition")) { [15:31:55.987] if (!is.null(pattern)) { [15:31:55.987] computeRestarts <- base::computeRestarts [15:31:55.987] grepl <- base::grepl [15:31:55.987] restarts <- computeRestarts(cond) [15:31:55.987] for (restart in restarts) { [15:31:55.987] name <- restart$name [15:31:55.987] if (is.null(name)) [15:31:55.987] next [15:31:55.987] if (!grepl(pattern, name)) [15:31:55.987] next [15:31:55.987] invokeRestart(restart) [15:31:55.987] muffled <- TRUE [15:31:55.987] break [15:31:55.987] } [15:31:55.987] } [15:31:55.987] } [15:31:55.987] invisible(muffled) [15:31:55.987] } [15:31:55.987] muffleCondition(cond, pattern = "^muffle") [15:31:55.987] } [15:31:55.987] } [15:31:55.987] } [15:31:55.987] })) [15:31:55.987] }, error = function(ex) { [15:31:55.987] base::structure(base::list(value = NULL, visible = NULL, [15:31:55.987] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:55.987] ...future.rng), started = ...future.startTime, [15:31:55.987] finished = Sys.time(), session_uuid = NA_character_, [15:31:55.987] version = "1.8"), class = "FutureResult") [15:31:55.987] }, finally = { [15:31:55.987] if (!identical(...future.workdir, getwd())) [15:31:55.987] setwd(...future.workdir) [15:31:55.987] { [15:31:55.987] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:55.987] ...future.oldOptions$nwarnings <- NULL [15:31:55.987] } [15:31:55.987] base::options(...future.oldOptions) [15:31:55.987] if (.Platform$OS.type == "windows") { [15:31:55.987] old_names <- names(...future.oldEnvVars) [15:31:55.987] envs <- base::Sys.getenv() [15:31:55.987] names <- names(envs) [15:31:55.987] common <- intersect(names, old_names) [15:31:55.987] added <- setdiff(names, old_names) [15:31:55.987] removed <- setdiff(old_names, names) [15:31:55.987] changed <- common[...future.oldEnvVars[common] != [15:31:55.987] envs[common]] [15:31:55.987] NAMES <- toupper(changed) [15:31:55.987] args <- list() [15:31:55.987] for (kk in seq_along(NAMES)) { [15:31:55.987] name <- changed[[kk]] [15:31:55.987] NAME <- NAMES[[kk]] [15:31:55.987] if (name != NAME && is.element(NAME, old_names)) [15:31:55.987] next [15:31:55.987] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:55.987] } [15:31:55.987] NAMES <- toupper(added) [15:31:55.987] for (kk in seq_along(NAMES)) { [15:31:55.987] name <- added[[kk]] [15:31:55.987] NAME <- NAMES[[kk]] [15:31:55.987] if (name != NAME && is.element(NAME, old_names)) [15:31:55.987] next [15:31:55.987] args[[name]] <- "" [15:31:55.987] } [15:31:55.987] NAMES <- toupper(removed) [15:31:55.987] for (kk in seq_along(NAMES)) { [15:31:55.987] name <- removed[[kk]] [15:31:55.987] NAME <- NAMES[[kk]] [15:31:55.987] if (name != NAME && is.element(NAME, old_names)) [15:31:55.987] next [15:31:55.987] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:55.987] } [15:31:55.987] if (length(args) > 0) [15:31:55.987] base::do.call(base::Sys.setenv, args = args) [15:31:55.987] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:55.987] } [15:31:55.987] else { [15:31:55.987] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:55.987] } [15:31:55.987] { [15:31:55.987] if (base::length(...future.futureOptionsAdded) > [15:31:55.987] 0L) { [15:31:55.987] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:55.987] base::names(opts) <- ...future.futureOptionsAdded [15:31:55.987] base::options(opts) [15:31:55.987] } [15:31:55.987] { [15:31:55.987] { [15:31:55.987] base::options(mc.cores = ...future.mc.cores.old) [15:31:55.987] NULL [15:31:55.987] } [15:31:55.987] options(future.plan = NULL) [15:31:55.987] if (is.na(NA_character_)) [15:31:55.987] Sys.unsetenv("R_FUTURE_PLAN") [15:31:55.987] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:55.987] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:55.987] .init = FALSE) [15:31:55.987] } [15:31:55.987] } [15:31:55.987] } [15:31:55.987] }) [15:31:55.987] if (TRUE) { [15:31:55.987] base::sink(type = "output", split = FALSE) [15:31:55.987] if (TRUE) { [15:31:55.987] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:55.987] } [15:31:55.987] else { [15:31:55.987] ...future.result["stdout"] <- base::list(NULL) [15:31:55.987] } [15:31:55.987] base::close(...future.stdout) [15:31:55.987] ...future.stdout <- NULL [15:31:55.987] } [15:31:55.987] ...future.result$conditions <- ...future.conditions [15:31:55.987] ...future.result$finished <- base::Sys.time() [15:31:55.987] ...future.result [15:31:55.987] } [15:31:55.996] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:55.997] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:55.997] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:55.998] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:55.998] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:55.999] Exporting '...future.elements_ii' (120 bytes) to cluster node #1 ... [15:31:56.000] Exporting '...future.elements_ii' (120 bytes) to cluster node #1 ... DONE [15:31:56.000] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:56.001] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:56.001] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:56.002] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:56.002] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:56.003] MultisessionFuture started [15:31:56.004] - Launch lazy future ... done [15:31:56.004] run() for 'MultisessionFuture' ... done [15:31:56.005] Created future: [15:31:56.031] receiveMessageFromWorker() for ClusterFuture ... [15:31:56.032] - Validating connection of MultisessionFuture [15:31:56.032] - received message: FutureResult [15:31:56.033] - Received FutureResult [15:31:56.033] - Erased future from FutureRegistry [15:31:56.033] result() for ClusterFuture ... [15:31:56.033] - result already collected: FutureResult [15:31:56.034] result() for ClusterFuture ... done [15:31:56.034] receiveMessageFromWorker() for ClusterFuture ... done [15:31:56.005] MultisessionFuture: [15:31:56.005] Label: 'future_lapply-3' [15:31:56.005] Expression: [15:31:56.005] { [15:31:56.005] do.call(function(...) { [15:31:56.005] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.005] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:56.005] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.005] on.exit(options(oopts), add = TRUE) [15:31:56.005] } [15:31:56.005] { [15:31:56.005] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:56.005] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.005] ...future.FUN(...future.X_jj, ...) [15:31:56.005] }) [15:31:56.005] } [15:31:56.005] }, args = future.call.arguments) [15:31:56.005] } [15:31:56.005] Lazy evaluation: FALSE [15:31:56.005] Asynchronous evaluation: TRUE [15:31:56.005] Local evaluation: TRUE [15:31:56.005] Environment: R_GlobalEnv [15:31:56.005] Capture standard output: TRUE [15:31:56.005] Capture condition classes: 'condition' (excluding 'nothing') [15:31:56.005] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 120 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:56.005] Packages: [15:31:56.005] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:56.005] Resolved: TRUE [15:31:56.005] Value: [15:31:56.005] Conditions captured: [15:31:56.005] Early signaling: FALSE [15:31:56.005] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:56.005] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:56.035] Chunk #3 of 4 ... DONE [15:31:56.035] Chunk #4 of 4 ... [15:31:56.035] - Finding globals in 'X' for chunk #4 ... [15:31:56.036] getGlobalsAndPackages() ... [15:31:56.036] Searching for globals... [15:31:56.037] [15:31:56.037] Searching for globals ... DONE [15:31:56.037] - globals: [0] [15:31:56.037] getGlobalsAndPackages() ... DONE [15:31:56.038] + additional globals found: [n=0] [15:31:56.038] + additional namespaces needed: [n=0] [15:31:56.038] - Finding globals in 'X' for chunk #4 ... DONE [15:31:56.039] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:56.039] - seeds: [15:31:56.039] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.040] getGlobalsAndPackages() ... [15:31:56.040] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.040] Resolving globals: FALSE [15:31:56.040] Tweak future expression to call with '...' arguments ... [15:31:56.041] { [15:31:56.041] do.call(function(...) { [15:31:56.041] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.041] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:56.041] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.041] on.exit(options(oopts), add = TRUE) [15:31:56.041] } [15:31:56.041] { [15:31:56.041] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:56.041] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.041] ...future.FUN(...future.X_jj, ...) [15:31:56.041] }) [15:31:56.041] } [15:31:56.041] }, args = future.call.arguments) [15:31:56.041] } [15:31:56.042] Tweak future expression to call with '...' arguments ... DONE [15:31:56.042] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.043] [15:31:56.043] getGlobalsAndPackages() ... DONE [15:31:56.044] run() for 'Future' ... [15:31:56.044] - state: 'created' [15:31:56.044] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:56.065] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:56.066] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:56.066] - Field: 'node' [15:31:56.066] - Field: 'label' [15:31:56.067] - Field: 'local' [15:31:56.067] - Field: 'owner' [15:31:56.067] - Field: 'envir' [15:31:56.068] - Field: 'workers' [15:31:56.068] - Field: 'packages' [15:31:56.068] - Field: 'gc' [15:31:56.069] - Field: 'conditions' [15:31:56.069] - Field: 'persistent' [15:31:56.069] - Field: 'expr' [15:31:56.069] - Field: 'uuid' [15:31:56.070] - Field: 'seed' [15:31:56.070] - Field: 'version' [15:31:56.070] - Field: 'result' [15:31:56.071] - Field: 'asynchronous' [15:31:56.071] - Field: 'calls' [15:31:56.071] - Field: 'globals' [15:31:56.072] - Field: 'stdout' [15:31:56.072] - Field: 'earlySignal' [15:31:56.072] - Field: 'lazy' [15:31:56.073] - Field: 'state' [15:31:56.073] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:56.073] - Launch lazy future ... [15:31:56.074] Packages needed by the future expression (n = 0): [15:31:56.074] Packages needed by future strategies (n = 0): [15:31:56.075] { [15:31:56.075] { [15:31:56.075] { [15:31:56.075] ...future.startTime <- base::Sys.time() [15:31:56.075] { [15:31:56.075] { [15:31:56.075] { [15:31:56.075] { [15:31:56.075] base::local({ [15:31:56.075] has_future <- base::requireNamespace("future", [15:31:56.075] quietly = TRUE) [15:31:56.075] if (has_future) { [15:31:56.075] ns <- base::getNamespace("future") [15:31:56.075] version <- ns[[".package"]][["version"]] [15:31:56.075] if (is.null(version)) [15:31:56.075] version <- utils::packageVersion("future") [15:31:56.075] } [15:31:56.075] else { [15:31:56.075] version <- NULL [15:31:56.075] } [15:31:56.075] if (!has_future || version < "1.8.0") { [15:31:56.075] info <- base::c(r_version = base::gsub("R version ", [15:31:56.075] "", base::R.version$version.string), [15:31:56.075] platform = base::sprintf("%s (%s-bit)", [15:31:56.075] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:56.075] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:56.075] "release", "version")], collapse = " "), [15:31:56.075] hostname = base::Sys.info()[["nodename"]]) [15:31:56.075] info <- base::sprintf("%s: %s", base::names(info), [15:31:56.075] info) [15:31:56.075] info <- base::paste(info, collapse = "; ") [15:31:56.075] if (!has_future) { [15:31:56.075] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:56.075] info) [15:31:56.075] } [15:31:56.075] else { [15:31:56.075] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:56.075] info, version) [15:31:56.075] } [15:31:56.075] base::stop(msg) [15:31:56.075] } [15:31:56.075] }) [15:31:56.075] } [15:31:56.075] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:56.075] base::options(mc.cores = 1L) [15:31:56.075] } [15:31:56.075] ...future.strategy.old <- future::plan("list") [15:31:56.075] options(future.plan = NULL) [15:31:56.075] Sys.unsetenv("R_FUTURE_PLAN") [15:31:56.075] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:56.075] } [15:31:56.075] ...future.workdir <- getwd() [15:31:56.075] } [15:31:56.075] ...future.oldOptions <- base::as.list(base::.Options) [15:31:56.075] ...future.oldEnvVars <- base::Sys.getenv() [15:31:56.075] } [15:31:56.075] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:56.075] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:56.075] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:56.075] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:56.075] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:56.075] future.stdout.windows.reencode = NULL, width = 80L) [15:31:56.075] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:56.075] base::names(...future.oldOptions)) [15:31:56.075] } [15:31:56.075] if (FALSE) { [15:31:56.075] } [15:31:56.075] else { [15:31:56.075] if (TRUE) { [15:31:56.075] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:56.075] open = "w") [15:31:56.075] } [15:31:56.075] else { [15:31:56.075] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:56.075] windows = "NUL", "/dev/null"), open = "w") [15:31:56.075] } [15:31:56.075] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:56.075] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:56.075] base::sink(type = "output", split = FALSE) [15:31:56.075] base::close(...future.stdout) [15:31:56.075] }, add = TRUE) [15:31:56.075] } [15:31:56.075] ...future.frame <- base::sys.nframe() [15:31:56.075] ...future.conditions <- base::list() [15:31:56.075] ...future.rng <- base::globalenv()$.Random.seed [15:31:56.075] if (FALSE) { [15:31:56.075] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:56.075] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:56.075] } [15:31:56.075] ...future.result <- base::tryCatch({ [15:31:56.075] base::withCallingHandlers({ [15:31:56.075] ...future.value <- base::withVisible(base::local({ [15:31:56.075] ...future.makeSendCondition <- base::local({ [15:31:56.075] sendCondition <- NULL [15:31:56.075] function(frame = 1L) { [15:31:56.075] if (is.function(sendCondition)) [15:31:56.075] return(sendCondition) [15:31:56.075] ns <- getNamespace("parallel") [15:31:56.075] if (exists("sendData", mode = "function", [15:31:56.075] envir = ns)) { [15:31:56.075] parallel_sendData <- get("sendData", mode = "function", [15:31:56.075] envir = ns) [15:31:56.075] envir <- sys.frame(frame) [15:31:56.075] master <- NULL [15:31:56.075] while (!identical(envir, .GlobalEnv) && [15:31:56.075] !identical(envir, emptyenv())) { [15:31:56.075] if (exists("master", mode = "list", envir = envir, [15:31:56.075] inherits = FALSE)) { [15:31:56.075] master <- get("master", mode = "list", [15:31:56.075] envir = envir, inherits = FALSE) [15:31:56.075] if (inherits(master, c("SOCKnode", [15:31:56.075] "SOCK0node"))) { [15:31:56.075] sendCondition <<- function(cond) { [15:31:56.075] data <- list(type = "VALUE", value = cond, [15:31:56.075] success = TRUE) [15:31:56.075] parallel_sendData(master, data) [15:31:56.075] } [15:31:56.075] return(sendCondition) [15:31:56.075] } [15:31:56.075] } [15:31:56.075] frame <- frame + 1L [15:31:56.075] envir <- sys.frame(frame) [15:31:56.075] } [15:31:56.075] } [15:31:56.075] sendCondition <<- function(cond) NULL [15:31:56.075] } [15:31:56.075] }) [15:31:56.075] withCallingHandlers({ [15:31:56.075] { [15:31:56.075] do.call(function(...) { [15:31:56.075] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.075] if (!identical(...future.globals.maxSize.org, [15:31:56.075] ...future.globals.maxSize)) { [15:31:56.075] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.075] on.exit(options(oopts), add = TRUE) [15:31:56.075] } [15:31:56.075] { [15:31:56.075] lapply(seq_along(...future.elements_ii), [15:31:56.075] FUN = function(jj) { [15:31:56.075] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.075] ...future.FUN(...future.X_jj, ...) [15:31:56.075] }) [15:31:56.075] } [15:31:56.075] }, args = future.call.arguments) [15:31:56.075] } [15:31:56.075] }, immediateCondition = function(cond) { [15:31:56.075] sendCondition <- ...future.makeSendCondition() [15:31:56.075] sendCondition(cond) [15:31:56.075] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.075] { [15:31:56.075] inherits <- base::inherits [15:31:56.075] invokeRestart <- base::invokeRestart [15:31:56.075] is.null <- base::is.null [15:31:56.075] muffled <- FALSE [15:31:56.075] if (inherits(cond, "message")) { [15:31:56.075] muffled <- grepl(pattern, "muffleMessage") [15:31:56.075] if (muffled) [15:31:56.075] invokeRestart("muffleMessage") [15:31:56.075] } [15:31:56.075] else if (inherits(cond, "warning")) { [15:31:56.075] muffled <- grepl(pattern, "muffleWarning") [15:31:56.075] if (muffled) [15:31:56.075] invokeRestart("muffleWarning") [15:31:56.075] } [15:31:56.075] else if (inherits(cond, "condition")) { [15:31:56.075] if (!is.null(pattern)) { [15:31:56.075] computeRestarts <- base::computeRestarts [15:31:56.075] grepl <- base::grepl [15:31:56.075] restarts <- computeRestarts(cond) [15:31:56.075] for (restart in restarts) { [15:31:56.075] name <- restart$name [15:31:56.075] if (is.null(name)) [15:31:56.075] next [15:31:56.075] if (!grepl(pattern, name)) [15:31:56.075] next [15:31:56.075] invokeRestart(restart) [15:31:56.075] muffled <- TRUE [15:31:56.075] break [15:31:56.075] } [15:31:56.075] } [15:31:56.075] } [15:31:56.075] invisible(muffled) [15:31:56.075] } [15:31:56.075] muffleCondition(cond) [15:31:56.075] }) [15:31:56.075] })) [15:31:56.075] future::FutureResult(value = ...future.value$value, [15:31:56.075] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:56.075] ...future.rng), globalenv = if (FALSE) [15:31:56.075] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:56.075] ...future.globalenv.names)) [15:31:56.075] else NULL, started = ...future.startTime, version = "1.8") [15:31:56.075] }, condition = base::local({ [15:31:56.075] c <- base::c [15:31:56.075] inherits <- base::inherits [15:31:56.075] invokeRestart <- base::invokeRestart [15:31:56.075] length <- base::length [15:31:56.075] list <- base::list [15:31:56.075] seq.int <- base::seq.int [15:31:56.075] signalCondition <- base::signalCondition [15:31:56.075] sys.calls <- base::sys.calls [15:31:56.075] `[[` <- base::`[[` [15:31:56.075] `+` <- base::`+` [15:31:56.075] `<<-` <- base::`<<-` [15:31:56.075] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:56.075] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:56.075] 3L)] [15:31:56.075] } [15:31:56.075] function(cond) { [15:31:56.075] is_error <- inherits(cond, "error") [15:31:56.075] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:56.075] NULL) [15:31:56.075] if (is_error) { [15:31:56.075] sessionInformation <- function() { [15:31:56.075] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:56.075] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:56.075] search = base::search(), system = base::Sys.info()) [15:31:56.075] } [15:31:56.075] ...future.conditions[[length(...future.conditions) + [15:31:56.075] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:56.075] cond$call), session = sessionInformation(), [15:31:56.075] timestamp = base::Sys.time(), signaled = 0L) [15:31:56.075] signalCondition(cond) [15:31:56.075] } [15:31:56.075] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:56.075] "immediateCondition"))) { [15:31:56.075] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:56.075] ...future.conditions[[length(...future.conditions) + [15:31:56.075] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:56.075] if (TRUE && !signal) { [15:31:56.075] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.075] { [15:31:56.075] inherits <- base::inherits [15:31:56.075] invokeRestart <- base::invokeRestart [15:31:56.075] is.null <- base::is.null [15:31:56.075] muffled <- FALSE [15:31:56.075] if (inherits(cond, "message")) { [15:31:56.075] muffled <- grepl(pattern, "muffleMessage") [15:31:56.075] if (muffled) [15:31:56.075] invokeRestart("muffleMessage") [15:31:56.075] } [15:31:56.075] else if (inherits(cond, "warning")) { [15:31:56.075] muffled <- grepl(pattern, "muffleWarning") [15:31:56.075] if (muffled) [15:31:56.075] invokeRestart("muffleWarning") [15:31:56.075] } [15:31:56.075] else if (inherits(cond, "condition")) { [15:31:56.075] if (!is.null(pattern)) { [15:31:56.075] computeRestarts <- base::computeRestarts [15:31:56.075] grepl <- base::grepl [15:31:56.075] restarts <- computeRestarts(cond) [15:31:56.075] for (restart in restarts) { [15:31:56.075] name <- restart$name [15:31:56.075] if (is.null(name)) [15:31:56.075] next [15:31:56.075] if (!grepl(pattern, name)) [15:31:56.075] next [15:31:56.075] invokeRestart(restart) [15:31:56.075] muffled <- TRUE [15:31:56.075] break [15:31:56.075] } [15:31:56.075] } [15:31:56.075] } [15:31:56.075] invisible(muffled) [15:31:56.075] } [15:31:56.075] muffleCondition(cond, pattern = "^muffle") [15:31:56.075] } [15:31:56.075] } [15:31:56.075] else { [15:31:56.075] if (TRUE) { [15:31:56.075] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.075] { [15:31:56.075] inherits <- base::inherits [15:31:56.075] invokeRestart <- base::invokeRestart [15:31:56.075] is.null <- base::is.null [15:31:56.075] muffled <- FALSE [15:31:56.075] if (inherits(cond, "message")) { [15:31:56.075] muffled <- grepl(pattern, "muffleMessage") [15:31:56.075] if (muffled) [15:31:56.075] invokeRestart("muffleMessage") [15:31:56.075] } [15:31:56.075] else if (inherits(cond, "warning")) { [15:31:56.075] muffled <- grepl(pattern, "muffleWarning") [15:31:56.075] if (muffled) [15:31:56.075] invokeRestart("muffleWarning") [15:31:56.075] } [15:31:56.075] else if (inherits(cond, "condition")) { [15:31:56.075] if (!is.null(pattern)) { [15:31:56.075] computeRestarts <- base::computeRestarts [15:31:56.075] grepl <- base::grepl [15:31:56.075] restarts <- computeRestarts(cond) [15:31:56.075] for (restart in restarts) { [15:31:56.075] name <- restart$name [15:31:56.075] if (is.null(name)) [15:31:56.075] next [15:31:56.075] if (!grepl(pattern, name)) [15:31:56.075] next [15:31:56.075] invokeRestart(restart) [15:31:56.075] muffled <- TRUE [15:31:56.075] break [15:31:56.075] } [15:31:56.075] } [15:31:56.075] } [15:31:56.075] invisible(muffled) [15:31:56.075] } [15:31:56.075] muffleCondition(cond, pattern = "^muffle") [15:31:56.075] } [15:31:56.075] } [15:31:56.075] } [15:31:56.075] })) [15:31:56.075] }, error = function(ex) { [15:31:56.075] base::structure(base::list(value = NULL, visible = NULL, [15:31:56.075] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:56.075] ...future.rng), started = ...future.startTime, [15:31:56.075] finished = Sys.time(), session_uuid = NA_character_, [15:31:56.075] version = "1.8"), class = "FutureResult") [15:31:56.075] }, finally = { [15:31:56.075] if (!identical(...future.workdir, getwd())) [15:31:56.075] setwd(...future.workdir) [15:31:56.075] { [15:31:56.075] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:56.075] ...future.oldOptions$nwarnings <- NULL [15:31:56.075] } [15:31:56.075] base::options(...future.oldOptions) [15:31:56.075] if (.Platform$OS.type == "windows") { [15:31:56.075] old_names <- names(...future.oldEnvVars) [15:31:56.075] envs <- base::Sys.getenv() [15:31:56.075] names <- names(envs) [15:31:56.075] common <- intersect(names, old_names) [15:31:56.075] added <- setdiff(names, old_names) [15:31:56.075] removed <- setdiff(old_names, names) [15:31:56.075] changed <- common[...future.oldEnvVars[common] != [15:31:56.075] envs[common]] [15:31:56.075] NAMES <- toupper(changed) [15:31:56.075] args <- list() [15:31:56.075] for (kk in seq_along(NAMES)) { [15:31:56.075] name <- changed[[kk]] [15:31:56.075] NAME <- NAMES[[kk]] [15:31:56.075] if (name != NAME && is.element(NAME, old_names)) [15:31:56.075] next [15:31:56.075] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:56.075] } [15:31:56.075] NAMES <- toupper(added) [15:31:56.075] for (kk in seq_along(NAMES)) { [15:31:56.075] name <- added[[kk]] [15:31:56.075] NAME <- NAMES[[kk]] [15:31:56.075] if (name != NAME && is.element(NAME, old_names)) [15:31:56.075] next [15:31:56.075] args[[name]] <- "" [15:31:56.075] } [15:31:56.075] NAMES <- toupper(removed) [15:31:56.075] for (kk in seq_along(NAMES)) { [15:31:56.075] name <- removed[[kk]] [15:31:56.075] NAME <- NAMES[[kk]] [15:31:56.075] if (name != NAME && is.element(NAME, old_names)) [15:31:56.075] next [15:31:56.075] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:56.075] } [15:31:56.075] if (length(args) > 0) [15:31:56.075] base::do.call(base::Sys.setenv, args = args) [15:31:56.075] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:56.075] } [15:31:56.075] else { [15:31:56.075] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:56.075] } [15:31:56.075] { [15:31:56.075] if (base::length(...future.futureOptionsAdded) > [15:31:56.075] 0L) { [15:31:56.075] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:56.075] base::names(opts) <- ...future.futureOptionsAdded [15:31:56.075] base::options(opts) [15:31:56.075] } [15:31:56.075] { [15:31:56.075] { [15:31:56.075] base::options(mc.cores = ...future.mc.cores.old) [15:31:56.075] NULL [15:31:56.075] } [15:31:56.075] options(future.plan = NULL) [15:31:56.075] if (is.na(NA_character_)) [15:31:56.075] Sys.unsetenv("R_FUTURE_PLAN") [15:31:56.075] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:56.075] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:56.075] .init = FALSE) [15:31:56.075] } [15:31:56.075] } [15:31:56.075] } [15:31:56.075] }) [15:31:56.075] if (TRUE) { [15:31:56.075] base::sink(type = "output", split = FALSE) [15:31:56.075] if (TRUE) { [15:31:56.075] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:56.075] } [15:31:56.075] else { [15:31:56.075] ...future.result["stdout"] <- base::list(NULL) [15:31:56.075] } [15:31:56.075] base::close(...future.stdout) [15:31:56.075] ...future.stdout <- NULL [15:31:56.075] } [15:31:56.075] ...future.result$conditions <- ...future.conditions [15:31:56.075] ...future.result$finished <- base::Sys.time() [15:31:56.075] ...future.result [15:31:56.075] } [15:31:56.085] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:56.086] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:56.086] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:56.087] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:56.087] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:56.088] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [15:31:56.089] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [15:31:56.089] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:56.090] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:56.091] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:56.092] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:56.092] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:56.093] MultisessionFuture started [15:31:56.094] - Launch lazy future ... done [15:31:56.094] run() for 'MultisessionFuture' ... done [15:31:56.094] Created future: [15:31:56.121] receiveMessageFromWorker() for ClusterFuture ... [15:31:56.121] - Validating connection of MultisessionFuture [15:31:56.122] - received message: FutureResult [15:31:56.122] - Received FutureResult [15:31:56.123] - Erased future from FutureRegistry [15:31:56.123] result() for ClusterFuture ... [15:31:56.123] - result already collected: FutureResult [15:31:56.123] result() for ClusterFuture ... done [15:31:56.124] receiveMessageFromWorker() for ClusterFuture ... done [15:31:56.095] MultisessionFuture: [15:31:56.095] Label: 'future_lapply-4' [15:31:56.095] Expression: [15:31:56.095] { [15:31:56.095] do.call(function(...) { [15:31:56.095] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.095] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:56.095] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.095] on.exit(options(oopts), add = TRUE) [15:31:56.095] } [15:31:56.095] { [15:31:56.095] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:56.095] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.095] ...future.FUN(...future.X_jj, ...) [15:31:56.095] }) [15:31:56.095] } [15:31:56.095] }, args = future.call.arguments) [15:31:56.095] } [15:31:56.095] Lazy evaluation: FALSE [15:31:56.095] Asynchronous evaluation: TRUE [15:31:56.095] Local evaluation: TRUE [15:31:56.095] Environment: R_GlobalEnv [15:31:56.095] Capture standard output: TRUE [15:31:56.095] Capture condition classes: 'condition' (excluding 'nothing') [15:31:56.095] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:56.095] Packages: [15:31:56.095] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:56.095] Resolved: TRUE [15:31:56.095] Value: [15:31:56.095] Conditions captured: [15:31:56.095] Early signaling: FALSE [15:31:56.095] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:56.095] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:56.124] Chunk #4 of 4 ... DONE [15:31:56.125] Launching 4 futures (chunks) ... DONE [15:31:56.125] Resolving 4 futures (chunks) ... [15:31:56.125] resolve() on list ... [15:31:56.125] recursive: 0 [15:31:56.126] length: 4 [15:31:56.126] [15:31:56.126] Future #1 [15:31:56.126] result() for ClusterFuture ... [15:31:56.127] - result already collected: FutureResult [15:31:56.127] result() for ClusterFuture ... done [15:31:56.127] result() for ClusterFuture ... [15:31:56.127] - result already collected: FutureResult [15:31:56.128] result() for ClusterFuture ... done [15:31:56.128] signalConditionsASAP(MultisessionFuture, pos=1) ... [15:31:56.128] - nx: 4 [15:31:56.128] - relay: TRUE [15:31:56.128] - stdout: TRUE [15:31:56.129] - signal: TRUE [15:31:56.129] - resignal: FALSE [15:31:56.129] - force: TRUE [15:31:56.129] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [15:31:56.130] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [15:31:56.130] - until=1 [15:31:56.130] - relaying element #1 [15:31:56.130] result() for ClusterFuture ... [15:31:56.130] - result already collected: FutureResult [15:31:56.131] result() for ClusterFuture ... done [15:31:56.131] result() for ClusterFuture ... [15:31:56.131] - result already collected: FutureResult [15:31:56.131] result() for ClusterFuture ... done [15:31:56.132] result() for ClusterFuture ... [15:31:56.132] - result already collected: FutureResult [15:31:56.132] result() for ClusterFuture ... done [15:31:56.132] result() for ClusterFuture ... [15:31:56.133] - result already collected: FutureResult [15:31:56.133] result() for ClusterFuture ... done [15:31:56.133] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:56.133] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:56.133] signalConditionsASAP(MultisessionFuture, pos=1) ... done [15:31:56.134] length: 3 (resolved future 1) [15:31:56.134] Future #2 [15:31:56.134] result() for ClusterFuture ... [15:31:56.134] - result already collected: FutureResult [15:31:56.135] result() for ClusterFuture ... done [15:31:56.135] result() for ClusterFuture ... [15:31:56.135] - result already collected: FutureResult [15:31:56.135] result() for ClusterFuture ... done [15:31:56.136] signalConditionsASAP(MultisessionFuture, pos=2) ... [15:31:56.136] - nx: 4 [15:31:56.136] - relay: TRUE [15:31:56.136] - stdout: TRUE [15:31:56.136] - signal: TRUE [15:31:56.137] - resignal: FALSE [15:31:56.137] - force: TRUE [15:31:56.137] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:56.137] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:56.138] - until=2 [15:31:56.138] - relaying element #2 [15:31:56.138] result() for ClusterFuture ... [15:31:56.138] - result already collected: FutureResult [15:31:56.138] result() for ClusterFuture ... done [15:31:56.139] result() for ClusterFuture ... [15:31:56.139] - result already collected: FutureResult [15:31:56.139] result() for ClusterFuture ... done [15:31:56.139] result() for ClusterFuture ... [15:31:56.140] - result already collected: FutureResult [15:31:56.140] result() for ClusterFuture ... done [15:31:56.140] result() for ClusterFuture ... [15:31:56.140] - result already collected: FutureResult [15:31:56.140] result() for ClusterFuture ... done [15:31:56.141] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:56.141] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:56.141] signalConditionsASAP(MultisessionFuture, pos=2) ... done [15:31:56.141] length: 2 (resolved future 2) [15:31:56.142] Future #3 [15:31:56.142] result() for ClusterFuture ... [15:31:56.142] - result already collected: FutureResult [15:31:56.142] result() for ClusterFuture ... done [15:31:56.143] result() for ClusterFuture ... [15:31:56.143] - result already collected: FutureResult [15:31:56.143] result() for ClusterFuture ... done [15:31:56.143] signalConditionsASAP(MultisessionFuture, pos=3) ... [15:31:56.144] - nx: 4 [15:31:56.144] - relay: TRUE [15:31:56.144] - stdout: TRUE [15:31:56.144] - signal: TRUE [15:31:56.145] - resignal: FALSE [15:31:56.145] - force: TRUE [15:31:56.145] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:56.145] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:56.145] - until=3 [15:31:56.146] - relaying element #3 [15:31:56.146] result() for ClusterFuture ... [15:31:56.146] - result already collected: FutureResult [15:31:56.146] result() for ClusterFuture ... done [15:31:56.147] result() for ClusterFuture ... [15:31:56.147] - result already collected: FutureResult [15:31:56.147] result() for ClusterFuture ... done [15:31:56.147] result() for ClusterFuture ... [15:31:56.148] - result already collected: FutureResult [15:31:56.148] result() for ClusterFuture ... done [15:31:56.148] result() for ClusterFuture ... [15:31:56.148] - result already collected: FutureResult [15:31:56.148] result() for ClusterFuture ... done [15:31:56.149] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:56.149] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:56.149] signalConditionsASAP(MultisessionFuture, pos=3) ... done [15:31:56.149] length: 1 (resolved future 3) [15:31:56.150] Future #4 [15:31:56.150] result() for ClusterFuture ... [15:31:56.150] - result already collected: FutureResult [15:31:56.150] result() for ClusterFuture ... done [15:31:56.151] result() for ClusterFuture ... [15:31:56.151] - result already collected: FutureResult [15:31:56.151] result() for ClusterFuture ... done [15:31:56.151] signalConditionsASAP(MultisessionFuture, pos=4) ... [15:31:56.152] - nx: 4 [15:31:56.152] - relay: TRUE [15:31:56.152] - stdout: TRUE [15:31:56.152] - signal: TRUE [15:31:56.153] - resignal: FALSE [15:31:56.153] - force: TRUE [15:31:56.153] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:56.153] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:56.153] - until=4 [15:31:56.153] - relaying element #4 [15:31:56.154] result() for ClusterFuture ... [15:31:56.154] - result already collected: FutureResult [15:31:56.154] result() for ClusterFuture ... done [15:31:56.154] result() for ClusterFuture ... [15:31:56.154] - result already collected: FutureResult [15:31:56.154] result() for ClusterFuture ... done [15:31:56.155] result() for ClusterFuture ... [15:31:56.155] - result already collected: FutureResult [15:31:56.155] result() for ClusterFuture ... done [15:31:56.155] result() for ClusterFuture ... [15:31:56.156] - result already collected: FutureResult [15:31:56.156] result() for ClusterFuture ... done [15:31:56.156] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:56.156] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:56.157] signalConditionsASAP(MultisessionFuture, pos=4) ... done [15:31:56.157] length: 0 (resolved future 4) [15:31:56.157] Relaying remaining futures [15:31:56.157] signalConditionsASAP(NULL, pos=0) ... [15:31:56.158] - nx: 4 [15:31:56.158] - relay: TRUE [15:31:56.158] - stdout: TRUE [15:31:56.158] - signal: TRUE [15:31:56.158] - resignal: FALSE [15:31:56.158] - force: TRUE [15:31:56.158] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:56.159] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [15:31:56.159] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:56.159] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:56.159] signalConditionsASAP(NULL, pos=0) ... done [15:31:56.159] resolve() on list ... DONE [15:31:56.160] result() for ClusterFuture ... [15:31:56.160] - result already collected: FutureResult [15:31:56.160] result() for ClusterFuture ... done [15:31:56.160] result() for ClusterFuture ... [15:31:56.160] - result already collected: FutureResult [15:31:56.160] result() for ClusterFuture ... done [15:31:56.161] result() for ClusterFuture ... [15:31:56.161] - result already collected: FutureResult [15:31:56.161] result() for ClusterFuture ... done [15:31:56.161] result() for ClusterFuture ... [15:31:56.161] - result already collected: FutureResult [15:31:56.162] result() for ClusterFuture ... done [15:31:56.162] result() for ClusterFuture ... [15:31:56.162] - result already collected: FutureResult [15:31:56.163] result() for ClusterFuture ... done [15:31:56.163] result() for ClusterFuture ... [15:31:56.163] - result already collected: FutureResult [15:31:56.164] result() for ClusterFuture ... done [15:31:56.164] result() for ClusterFuture ... [15:31:56.164] - result already collected: FutureResult [15:31:56.165] result() for ClusterFuture ... done [15:31:56.165] result() for ClusterFuture ... [15:31:56.165] - result already collected: FutureResult [15:31:56.165] result() for ClusterFuture ... done [15:31:56.166] - Number of value chunks collected: 4 [15:31:56.166] Resolving 4 futures (chunks) ... DONE [15:31:56.166] Reducing values from 4 chunks ... [15:31:56.167] - Number of values collected after concatenation: 4 [15:31:56.167] - Number of values expected: 4 [15:31:56.167] Reducing values from 4 chunks ... DONE [15:31:56.167] 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 [15:31:56.170] future_lapply() ... [15:31:56.174] Number of chunks: 4 [15:31:56.174] getGlobalsAndPackagesXApply() ... [15:31:56.174] - future.globals: TRUE [15:31:56.175] getGlobalsAndPackages() ... [15:31:56.175] Searching for globals... [15:31:56.177] - globals found: [2] 'FUN', '.Internal' [15:31:56.177] Searching for globals ... DONE [15:31:56.178] Resolving globals: FALSE [15:31:56.178] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:56.179] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:56.179] - globals: [1] 'FUN' [15:31:56.179] [15:31:56.179] getGlobalsAndPackages() ... DONE [15:31:56.179] - globals found/used: [n=1] 'FUN' [15:31:56.179] - needed namespaces: [n=0] [15:31:56.180] Finding globals ... DONE [15:31:56.180] - use_args: TRUE [15:31:56.180] - Getting '...' globals ... [15:31:56.180] resolve() on list ... [15:31:56.181] recursive: 0 [15:31:56.181] length: 1 [15:31:56.181] elements: '...' [15:31:56.181] length: 0 (resolved future 1) [15:31:56.181] resolve() on list ... DONE [15:31:56.181] - '...' content: [n=1] 'length' [15:31:56.182] List of 1 [15:31:56.182] $ ...:List of 1 [15:31:56.182] ..$ length: int 2 [15:31:56.182] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:56.182] - attr(*, "where")=List of 1 [15:31:56.182] ..$ ...: [15:31:56.182] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:56.182] - attr(*, "resolved")= logi TRUE [15:31:56.182] - attr(*, "total_size")= num NA [15:31:56.185] - Getting '...' globals ... DONE [15:31:56.186] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:56.186] List of 2 [15:31:56.186] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:56.186] $ ... :List of 1 [15:31:56.186] ..$ length: int 2 [15:31:56.186] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:56.186] - attr(*, "where")=List of 2 [15:31:56.186] ..$ ...future.FUN: [15:31:56.186] ..$ ... : [15:31:56.186] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:56.186] - attr(*, "resolved")= logi FALSE [15:31:56.186] - attr(*, "total_size")= num 2240 [15:31:56.190] Packages to be attached in all futures: [n=0] [15:31:56.190] getGlobalsAndPackagesXApply() ... DONE [15:31:56.191] Number of futures (= number of chunks): 4 [15:31:56.191] Launching 4 futures (chunks) ... [15:31:56.191] Chunk #1 of 4 ... [15:31:56.191] - Finding globals in 'X' for chunk #1 ... [15:31:56.191] getGlobalsAndPackages() ... [15:31:56.191] Searching for globals... [15:31:56.192] [15:31:56.192] Searching for globals ... DONE [15:31:56.192] - globals: [0] [15:31:56.192] getGlobalsAndPackages() ... DONE [15:31:56.193] + additional globals found: [n=0] [15:31:56.193] + additional namespaces needed: [n=0] [15:31:56.193] - Finding globals in 'X' for chunk #1 ... DONE [15:31:56.193] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:56.193] - seeds: [15:31:56.193] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.194] getGlobalsAndPackages() ... [15:31:56.194] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.194] Resolving globals: FALSE [15:31:56.194] Tweak future expression to call with '...' arguments ... [15:31:56.194] { [15:31:56.194] do.call(function(...) { [15:31:56.194] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.194] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:56.194] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.194] on.exit(options(oopts), add = TRUE) [15:31:56.194] } [15:31:56.194] { [15:31:56.194] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:56.194] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.194] ...future.FUN(...future.X_jj, ...) [15:31:56.194] }) [15:31:56.194] } [15:31:56.194] }, args = future.call.arguments) [15:31:56.194] } [15:31:56.195] Tweak future expression to call with '...' arguments ... DONE [15:31:56.195] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.196] [15:31:56.196] getGlobalsAndPackages() ... DONE [15:31:56.196] run() for 'Future' ... [15:31:56.196] - state: 'created' [15:31:56.197] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:56.213] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:56.213] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:56.213] - Field: 'node' [15:31:56.214] - Field: 'label' [15:31:56.214] - Field: 'local' [15:31:56.214] - Field: 'owner' [15:31:56.215] - Field: 'envir' [15:31:56.215] - Field: 'workers' [15:31:56.215] - Field: 'packages' [15:31:56.215] - Field: 'gc' [15:31:56.216] - Field: 'conditions' [15:31:56.216] - Field: 'persistent' [15:31:56.216] - Field: 'expr' [15:31:56.217] - Field: 'uuid' [15:31:56.217] - Field: 'seed' [15:31:56.217] - Field: 'version' [15:31:56.217] - Field: 'result' [15:31:56.218] - Field: 'asynchronous' [15:31:56.218] - Field: 'calls' [15:31:56.218] - Field: 'globals' [15:31:56.219] - Field: 'stdout' [15:31:56.219] - Field: 'earlySignal' [15:31:56.219] - Field: 'lazy' [15:31:56.220] - Field: 'state' [15:31:56.220] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:56.220] - Launch lazy future ... [15:31:56.221] Packages needed by the future expression (n = 0): [15:31:56.221] Packages needed by future strategies (n = 0): [15:31:56.225] { [15:31:56.225] { [15:31:56.225] { [15:31:56.225] ...future.startTime <- base::Sys.time() [15:31:56.225] { [15:31:56.225] { [15:31:56.225] { [15:31:56.225] { [15:31:56.225] base::local({ [15:31:56.225] has_future <- base::requireNamespace("future", [15:31:56.225] quietly = TRUE) [15:31:56.225] if (has_future) { [15:31:56.225] ns <- base::getNamespace("future") [15:31:56.225] version <- ns[[".package"]][["version"]] [15:31:56.225] if (is.null(version)) [15:31:56.225] version <- utils::packageVersion("future") [15:31:56.225] } [15:31:56.225] else { [15:31:56.225] version <- NULL [15:31:56.225] } [15:31:56.225] if (!has_future || version < "1.8.0") { [15:31:56.225] info <- base::c(r_version = base::gsub("R version ", [15:31:56.225] "", base::R.version$version.string), [15:31:56.225] platform = base::sprintf("%s (%s-bit)", [15:31:56.225] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:56.225] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:56.225] "release", "version")], collapse = " "), [15:31:56.225] hostname = base::Sys.info()[["nodename"]]) [15:31:56.225] info <- base::sprintf("%s: %s", base::names(info), [15:31:56.225] info) [15:31:56.225] info <- base::paste(info, collapse = "; ") [15:31:56.225] if (!has_future) { [15:31:56.225] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:56.225] info) [15:31:56.225] } [15:31:56.225] else { [15:31:56.225] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:56.225] info, version) [15:31:56.225] } [15:31:56.225] base::stop(msg) [15:31:56.225] } [15:31:56.225] }) [15:31:56.225] } [15:31:56.225] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:56.225] base::options(mc.cores = 1L) [15:31:56.225] } [15:31:56.225] ...future.strategy.old <- future::plan("list") [15:31:56.225] options(future.plan = NULL) [15:31:56.225] Sys.unsetenv("R_FUTURE_PLAN") [15:31:56.225] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:56.225] } [15:31:56.225] ...future.workdir <- getwd() [15:31:56.225] } [15:31:56.225] ...future.oldOptions <- base::as.list(base::.Options) [15:31:56.225] ...future.oldEnvVars <- base::Sys.getenv() [15:31:56.225] } [15:31:56.225] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:56.225] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:56.225] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:56.225] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:56.225] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:56.225] future.stdout.windows.reencode = NULL, width = 80L) [15:31:56.225] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:56.225] base::names(...future.oldOptions)) [15:31:56.225] } [15:31:56.225] if (FALSE) { [15:31:56.225] } [15:31:56.225] else { [15:31:56.225] if (TRUE) { [15:31:56.225] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:56.225] open = "w") [15:31:56.225] } [15:31:56.225] else { [15:31:56.225] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:56.225] windows = "NUL", "/dev/null"), open = "w") [15:31:56.225] } [15:31:56.225] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:56.225] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:56.225] base::sink(type = "output", split = FALSE) [15:31:56.225] base::close(...future.stdout) [15:31:56.225] }, add = TRUE) [15:31:56.225] } [15:31:56.225] ...future.frame <- base::sys.nframe() [15:31:56.225] ...future.conditions <- base::list() [15:31:56.225] ...future.rng <- base::globalenv()$.Random.seed [15:31:56.225] if (FALSE) { [15:31:56.225] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:56.225] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:56.225] } [15:31:56.225] ...future.result <- base::tryCatch({ [15:31:56.225] base::withCallingHandlers({ [15:31:56.225] ...future.value <- base::withVisible(base::local({ [15:31:56.225] ...future.makeSendCondition <- base::local({ [15:31:56.225] sendCondition <- NULL [15:31:56.225] function(frame = 1L) { [15:31:56.225] if (is.function(sendCondition)) [15:31:56.225] return(sendCondition) [15:31:56.225] ns <- getNamespace("parallel") [15:31:56.225] if (exists("sendData", mode = "function", [15:31:56.225] envir = ns)) { [15:31:56.225] parallel_sendData <- get("sendData", mode = "function", [15:31:56.225] envir = ns) [15:31:56.225] envir <- sys.frame(frame) [15:31:56.225] master <- NULL [15:31:56.225] while (!identical(envir, .GlobalEnv) && [15:31:56.225] !identical(envir, emptyenv())) { [15:31:56.225] if (exists("master", mode = "list", envir = envir, [15:31:56.225] inherits = FALSE)) { [15:31:56.225] master <- get("master", mode = "list", [15:31:56.225] envir = envir, inherits = FALSE) [15:31:56.225] if (inherits(master, c("SOCKnode", [15:31:56.225] "SOCK0node"))) { [15:31:56.225] sendCondition <<- function(cond) { [15:31:56.225] data <- list(type = "VALUE", value = cond, [15:31:56.225] success = TRUE) [15:31:56.225] parallel_sendData(master, data) [15:31:56.225] } [15:31:56.225] return(sendCondition) [15:31:56.225] } [15:31:56.225] } [15:31:56.225] frame <- frame + 1L [15:31:56.225] envir <- sys.frame(frame) [15:31:56.225] } [15:31:56.225] } [15:31:56.225] sendCondition <<- function(cond) NULL [15:31:56.225] } [15:31:56.225] }) [15:31:56.225] withCallingHandlers({ [15:31:56.225] { [15:31:56.225] do.call(function(...) { [15:31:56.225] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.225] if (!identical(...future.globals.maxSize.org, [15:31:56.225] ...future.globals.maxSize)) { [15:31:56.225] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.225] on.exit(options(oopts), add = TRUE) [15:31:56.225] } [15:31:56.225] { [15:31:56.225] lapply(seq_along(...future.elements_ii), [15:31:56.225] FUN = function(jj) { [15:31:56.225] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.225] ...future.FUN(...future.X_jj, ...) [15:31:56.225] }) [15:31:56.225] } [15:31:56.225] }, args = future.call.arguments) [15:31:56.225] } [15:31:56.225] }, immediateCondition = function(cond) { [15:31:56.225] sendCondition <- ...future.makeSendCondition() [15:31:56.225] sendCondition(cond) [15:31:56.225] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.225] { [15:31:56.225] inherits <- base::inherits [15:31:56.225] invokeRestart <- base::invokeRestart [15:31:56.225] is.null <- base::is.null [15:31:56.225] muffled <- FALSE [15:31:56.225] if (inherits(cond, "message")) { [15:31:56.225] muffled <- grepl(pattern, "muffleMessage") [15:31:56.225] if (muffled) [15:31:56.225] invokeRestart("muffleMessage") [15:31:56.225] } [15:31:56.225] else if (inherits(cond, "warning")) { [15:31:56.225] muffled <- grepl(pattern, "muffleWarning") [15:31:56.225] if (muffled) [15:31:56.225] invokeRestart("muffleWarning") [15:31:56.225] } [15:31:56.225] else if (inherits(cond, "condition")) { [15:31:56.225] if (!is.null(pattern)) { [15:31:56.225] computeRestarts <- base::computeRestarts [15:31:56.225] grepl <- base::grepl [15:31:56.225] restarts <- computeRestarts(cond) [15:31:56.225] for (restart in restarts) { [15:31:56.225] name <- restart$name [15:31:56.225] if (is.null(name)) [15:31:56.225] next [15:31:56.225] if (!grepl(pattern, name)) [15:31:56.225] next [15:31:56.225] invokeRestart(restart) [15:31:56.225] muffled <- TRUE [15:31:56.225] break [15:31:56.225] } [15:31:56.225] } [15:31:56.225] } [15:31:56.225] invisible(muffled) [15:31:56.225] } [15:31:56.225] muffleCondition(cond) [15:31:56.225] }) [15:31:56.225] })) [15:31:56.225] future::FutureResult(value = ...future.value$value, [15:31:56.225] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:56.225] ...future.rng), globalenv = if (FALSE) [15:31:56.225] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:56.225] ...future.globalenv.names)) [15:31:56.225] else NULL, started = ...future.startTime, version = "1.8") [15:31:56.225] }, condition = base::local({ [15:31:56.225] c <- base::c [15:31:56.225] inherits <- base::inherits [15:31:56.225] invokeRestart <- base::invokeRestart [15:31:56.225] length <- base::length [15:31:56.225] list <- base::list [15:31:56.225] seq.int <- base::seq.int [15:31:56.225] signalCondition <- base::signalCondition [15:31:56.225] sys.calls <- base::sys.calls [15:31:56.225] `[[` <- base::`[[` [15:31:56.225] `+` <- base::`+` [15:31:56.225] `<<-` <- base::`<<-` [15:31:56.225] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:56.225] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:56.225] 3L)] [15:31:56.225] } [15:31:56.225] function(cond) { [15:31:56.225] is_error <- inherits(cond, "error") [15:31:56.225] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:56.225] NULL) [15:31:56.225] if (is_error) { [15:31:56.225] sessionInformation <- function() { [15:31:56.225] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:56.225] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:56.225] search = base::search(), system = base::Sys.info()) [15:31:56.225] } [15:31:56.225] ...future.conditions[[length(...future.conditions) + [15:31:56.225] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:56.225] cond$call), session = sessionInformation(), [15:31:56.225] timestamp = base::Sys.time(), signaled = 0L) [15:31:56.225] signalCondition(cond) [15:31:56.225] } [15:31:56.225] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:56.225] "immediateCondition"))) { [15:31:56.225] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:56.225] ...future.conditions[[length(...future.conditions) + [15:31:56.225] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:56.225] if (TRUE && !signal) { [15:31:56.225] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.225] { [15:31:56.225] inherits <- base::inherits [15:31:56.225] invokeRestart <- base::invokeRestart [15:31:56.225] is.null <- base::is.null [15:31:56.225] muffled <- FALSE [15:31:56.225] if (inherits(cond, "message")) { [15:31:56.225] muffled <- grepl(pattern, "muffleMessage") [15:31:56.225] if (muffled) [15:31:56.225] invokeRestart("muffleMessage") [15:31:56.225] } [15:31:56.225] else if (inherits(cond, "warning")) { [15:31:56.225] muffled <- grepl(pattern, "muffleWarning") [15:31:56.225] if (muffled) [15:31:56.225] invokeRestart("muffleWarning") [15:31:56.225] } [15:31:56.225] else if (inherits(cond, "condition")) { [15:31:56.225] if (!is.null(pattern)) { [15:31:56.225] computeRestarts <- base::computeRestarts [15:31:56.225] grepl <- base::grepl [15:31:56.225] restarts <- computeRestarts(cond) [15:31:56.225] for (restart in restarts) { [15:31:56.225] name <- restart$name [15:31:56.225] if (is.null(name)) [15:31:56.225] next [15:31:56.225] if (!grepl(pattern, name)) [15:31:56.225] next [15:31:56.225] invokeRestart(restart) [15:31:56.225] muffled <- TRUE [15:31:56.225] break [15:31:56.225] } [15:31:56.225] } [15:31:56.225] } [15:31:56.225] invisible(muffled) [15:31:56.225] } [15:31:56.225] muffleCondition(cond, pattern = "^muffle") [15:31:56.225] } [15:31:56.225] } [15:31:56.225] else { [15:31:56.225] if (TRUE) { [15:31:56.225] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.225] { [15:31:56.225] inherits <- base::inherits [15:31:56.225] invokeRestart <- base::invokeRestart [15:31:56.225] is.null <- base::is.null [15:31:56.225] muffled <- FALSE [15:31:56.225] if (inherits(cond, "message")) { [15:31:56.225] muffled <- grepl(pattern, "muffleMessage") [15:31:56.225] if (muffled) [15:31:56.225] invokeRestart("muffleMessage") [15:31:56.225] } [15:31:56.225] else if (inherits(cond, "warning")) { [15:31:56.225] muffled <- grepl(pattern, "muffleWarning") [15:31:56.225] if (muffled) [15:31:56.225] invokeRestart("muffleWarning") [15:31:56.225] } [15:31:56.225] else if (inherits(cond, "condition")) { [15:31:56.225] if (!is.null(pattern)) { [15:31:56.225] computeRestarts <- base::computeRestarts [15:31:56.225] grepl <- base::grepl [15:31:56.225] restarts <- computeRestarts(cond) [15:31:56.225] for (restart in restarts) { [15:31:56.225] name <- restart$name [15:31:56.225] if (is.null(name)) [15:31:56.225] next [15:31:56.225] if (!grepl(pattern, name)) [15:31:56.225] next [15:31:56.225] invokeRestart(restart) [15:31:56.225] muffled <- TRUE [15:31:56.225] break [15:31:56.225] } [15:31:56.225] } [15:31:56.225] } [15:31:56.225] invisible(muffled) [15:31:56.225] } [15:31:56.225] muffleCondition(cond, pattern = "^muffle") [15:31:56.225] } [15:31:56.225] } [15:31:56.225] } [15:31:56.225] })) [15:31:56.225] }, error = function(ex) { [15:31:56.225] base::structure(base::list(value = NULL, visible = NULL, [15:31:56.225] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:56.225] ...future.rng), started = ...future.startTime, [15:31:56.225] finished = Sys.time(), session_uuid = NA_character_, [15:31:56.225] version = "1.8"), class = "FutureResult") [15:31:56.225] }, finally = { [15:31:56.225] if (!identical(...future.workdir, getwd())) [15:31:56.225] setwd(...future.workdir) [15:31:56.225] { [15:31:56.225] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:56.225] ...future.oldOptions$nwarnings <- NULL [15:31:56.225] } [15:31:56.225] base::options(...future.oldOptions) [15:31:56.225] if (.Platform$OS.type == "windows") { [15:31:56.225] old_names <- names(...future.oldEnvVars) [15:31:56.225] envs <- base::Sys.getenv() [15:31:56.225] names <- names(envs) [15:31:56.225] common <- intersect(names, old_names) [15:31:56.225] added <- setdiff(names, old_names) [15:31:56.225] removed <- setdiff(old_names, names) [15:31:56.225] changed <- common[...future.oldEnvVars[common] != [15:31:56.225] envs[common]] [15:31:56.225] NAMES <- toupper(changed) [15:31:56.225] args <- list() [15:31:56.225] for (kk in seq_along(NAMES)) { [15:31:56.225] name <- changed[[kk]] [15:31:56.225] NAME <- NAMES[[kk]] [15:31:56.225] if (name != NAME && is.element(NAME, old_names)) [15:31:56.225] next [15:31:56.225] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:56.225] } [15:31:56.225] NAMES <- toupper(added) [15:31:56.225] for (kk in seq_along(NAMES)) { [15:31:56.225] name <- added[[kk]] [15:31:56.225] NAME <- NAMES[[kk]] [15:31:56.225] if (name != NAME && is.element(NAME, old_names)) [15:31:56.225] next [15:31:56.225] args[[name]] <- "" [15:31:56.225] } [15:31:56.225] NAMES <- toupper(removed) [15:31:56.225] for (kk in seq_along(NAMES)) { [15:31:56.225] name <- removed[[kk]] [15:31:56.225] NAME <- NAMES[[kk]] [15:31:56.225] if (name != NAME && is.element(NAME, old_names)) [15:31:56.225] next [15:31:56.225] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:56.225] } [15:31:56.225] if (length(args) > 0) [15:31:56.225] base::do.call(base::Sys.setenv, args = args) [15:31:56.225] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:56.225] } [15:31:56.225] else { [15:31:56.225] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:56.225] } [15:31:56.225] { [15:31:56.225] if (base::length(...future.futureOptionsAdded) > [15:31:56.225] 0L) { [15:31:56.225] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:56.225] base::names(opts) <- ...future.futureOptionsAdded [15:31:56.225] base::options(opts) [15:31:56.225] } [15:31:56.225] { [15:31:56.225] { [15:31:56.225] base::options(mc.cores = ...future.mc.cores.old) [15:31:56.225] NULL [15:31:56.225] } [15:31:56.225] options(future.plan = NULL) [15:31:56.225] if (is.na(NA_character_)) [15:31:56.225] Sys.unsetenv("R_FUTURE_PLAN") [15:31:56.225] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:56.225] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:56.225] .init = FALSE) [15:31:56.225] } [15:31:56.225] } [15:31:56.225] } [15:31:56.225] }) [15:31:56.225] if (TRUE) { [15:31:56.225] base::sink(type = "output", split = FALSE) [15:31:56.225] if (TRUE) { [15:31:56.225] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:56.225] } [15:31:56.225] else { [15:31:56.225] ...future.result["stdout"] <- base::list(NULL) [15:31:56.225] } [15:31:56.225] base::close(...future.stdout) [15:31:56.225] ...future.stdout <- NULL [15:31:56.225] } [15:31:56.225] ...future.result$conditions <- ...future.conditions [15:31:56.225] ...future.result$finished <- base::Sys.time() [15:31:56.225] ...future.result [15:31:56.225] } [15:31:56.233] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:56.234] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:56.234] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:56.235] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:56.235] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:56.236] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [15:31:56.236] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [15:31:56.237] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:56.237] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:56.237] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:56.238] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:56.238] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:56.239] MultisessionFuture started [15:31:56.239] - Launch lazy future ... done [15:31:56.240] run() for 'MultisessionFuture' ... done [15:31:56.240] Created future: [15:31:56.264] receiveMessageFromWorker() for ClusterFuture ... [15:31:56.264] - Validating connection of MultisessionFuture [15:31:56.265] - received message: FutureResult [15:31:56.265] - Received FutureResult [15:31:56.265] - Erased future from FutureRegistry [15:31:56.266] result() for ClusterFuture ... [15:31:56.266] - result already collected: FutureResult [15:31:56.266] result() for ClusterFuture ... done [15:31:56.266] receiveMessageFromWorker() for ClusterFuture ... done [15:31:56.240] MultisessionFuture: [15:31:56.240] Label: 'future_lapply-1' [15:31:56.240] Expression: [15:31:56.240] { [15:31:56.240] do.call(function(...) { [15:31:56.240] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.240] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:56.240] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.240] on.exit(options(oopts), add = TRUE) [15:31:56.240] } [15:31:56.240] { [15:31:56.240] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:56.240] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.240] ...future.FUN(...future.X_jj, ...) [15:31:56.240] }) [15:31:56.240] } [15:31:56.240] }, args = future.call.arguments) [15:31:56.240] } [15:31:56.240] Lazy evaluation: FALSE [15:31:56.240] Asynchronous evaluation: TRUE [15:31:56.240] Local evaluation: TRUE [15:31:56.240] Environment: R_GlobalEnv [15:31:56.240] Capture standard output: TRUE [15:31:56.240] Capture condition classes: 'condition' (excluding 'nothing') [15:31:56.240] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:56.240] Packages: [15:31:56.240] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:56.240] Resolved: TRUE [15:31:56.240] Value: [15:31:56.240] Conditions captured: [15:31:56.240] Early signaling: FALSE [15:31:56.240] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:56.240] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:56.267] Chunk #1 of 4 ... DONE [15:31:56.267] Chunk #2 of 4 ... [15:31:56.268] - Finding globals in 'X' for chunk #2 ... [15:31:56.268] getGlobalsAndPackages() ... [15:31:56.268] Searching for globals... [15:31:56.269] [15:31:56.269] Searching for globals ... DONE [15:31:56.269] - globals: [0] [15:31:56.269] getGlobalsAndPackages() ... DONE [15:31:56.270] + additional globals found: [n=0] [15:31:56.270] + additional namespaces needed: [n=0] [15:31:56.270] - Finding globals in 'X' for chunk #2 ... DONE [15:31:56.271] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:56.271] - seeds: [15:31:56.271] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.271] getGlobalsAndPackages() ... [15:31:56.272] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.272] Resolving globals: FALSE [15:31:56.272] Tweak future expression to call with '...' arguments ... [15:31:56.272] { [15:31:56.272] do.call(function(...) { [15:31:56.272] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.272] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:56.272] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.272] on.exit(options(oopts), add = TRUE) [15:31:56.272] } [15:31:56.272] { [15:31:56.272] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:56.272] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.272] ...future.FUN(...future.X_jj, ...) [15:31:56.272] }) [15:31:56.272] } [15:31:56.272] }, args = future.call.arguments) [15:31:56.272] } [15:31:56.273] Tweak future expression to call with '...' arguments ... DONE [15:31:56.274] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.274] [15:31:56.274] getGlobalsAndPackages() ... DONE [15:31:56.275] run() for 'Future' ... [15:31:56.275] - state: 'created' [15:31:56.276] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:56.295] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:56.295] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:56.296] - Field: 'node' [15:31:56.296] - Field: 'label' [15:31:56.296] - Field: 'local' [15:31:56.296] - Field: 'owner' [15:31:56.297] - Field: 'envir' [15:31:56.297] - Field: 'workers' [15:31:56.297] - Field: 'packages' [15:31:56.298] - Field: 'gc' [15:31:56.298] - Field: 'conditions' [15:31:56.298] - Field: 'persistent' [15:31:56.298] - Field: 'expr' [15:31:56.299] - Field: 'uuid' [15:31:56.299] - Field: 'seed' [15:31:56.299] - Field: 'version' [15:31:56.299] - Field: 'result' [15:31:56.300] - Field: 'asynchronous' [15:31:56.300] - Field: 'calls' [15:31:56.300] - Field: 'globals' [15:31:56.300] - Field: 'stdout' [15:31:56.301] - Field: 'earlySignal' [15:31:56.301] - Field: 'lazy' [15:31:56.301] - Field: 'state' [15:31:56.302] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:56.302] - Launch lazy future ... [15:31:56.302] Packages needed by the future expression (n = 0): [15:31:56.303] Packages needed by future strategies (n = 0): [15:31:56.304] { [15:31:56.304] { [15:31:56.304] { [15:31:56.304] ...future.startTime <- base::Sys.time() [15:31:56.304] { [15:31:56.304] { [15:31:56.304] { [15:31:56.304] { [15:31:56.304] base::local({ [15:31:56.304] has_future <- base::requireNamespace("future", [15:31:56.304] quietly = TRUE) [15:31:56.304] if (has_future) { [15:31:56.304] ns <- base::getNamespace("future") [15:31:56.304] version <- ns[[".package"]][["version"]] [15:31:56.304] if (is.null(version)) [15:31:56.304] version <- utils::packageVersion("future") [15:31:56.304] } [15:31:56.304] else { [15:31:56.304] version <- NULL [15:31:56.304] } [15:31:56.304] if (!has_future || version < "1.8.0") { [15:31:56.304] info <- base::c(r_version = base::gsub("R version ", [15:31:56.304] "", base::R.version$version.string), [15:31:56.304] platform = base::sprintf("%s (%s-bit)", [15:31:56.304] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:56.304] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:56.304] "release", "version")], collapse = " "), [15:31:56.304] hostname = base::Sys.info()[["nodename"]]) [15:31:56.304] info <- base::sprintf("%s: %s", base::names(info), [15:31:56.304] info) [15:31:56.304] info <- base::paste(info, collapse = "; ") [15:31:56.304] if (!has_future) { [15:31:56.304] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:56.304] info) [15:31:56.304] } [15:31:56.304] else { [15:31:56.304] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:56.304] info, version) [15:31:56.304] } [15:31:56.304] base::stop(msg) [15:31:56.304] } [15:31:56.304] }) [15:31:56.304] } [15:31:56.304] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:56.304] base::options(mc.cores = 1L) [15:31:56.304] } [15:31:56.304] ...future.strategy.old <- future::plan("list") [15:31:56.304] options(future.plan = NULL) [15:31:56.304] Sys.unsetenv("R_FUTURE_PLAN") [15:31:56.304] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:56.304] } [15:31:56.304] ...future.workdir <- getwd() [15:31:56.304] } [15:31:56.304] ...future.oldOptions <- base::as.list(base::.Options) [15:31:56.304] ...future.oldEnvVars <- base::Sys.getenv() [15:31:56.304] } [15:31:56.304] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:56.304] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:56.304] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:56.304] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:56.304] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:56.304] future.stdout.windows.reencode = NULL, width = 80L) [15:31:56.304] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:56.304] base::names(...future.oldOptions)) [15:31:56.304] } [15:31:56.304] if (FALSE) { [15:31:56.304] } [15:31:56.304] else { [15:31:56.304] if (TRUE) { [15:31:56.304] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:56.304] open = "w") [15:31:56.304] } [15:31:56.304] else { [15:31:56.304] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:56.304] windows = "NUL", "/dev/null"), open = "w") [15:31:56.304] } [15:31:56.304] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:56.304] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:56.304] base::sink(type = "output", split = FALSE) [15:31:56.304] base::close(...future.stdout) [15:31:56.304] }, add = TRUE) [15:31:56.304] } [15:31:56.304] ...future.frame <- base::sys.nframe() [15:31:56.304] ...future.conditions <- base::list() [15:31:56.304] ...future.rng <- base::globalenv()$.Random.seed [15:31:56.304] if (FALSE) { [15:31:56.304] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:56.304] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:56.304] } [15:31:56.304] ...future.result <- base::tryCatch({ [15:31:56.304] base::withCallingHandlers({ [15:31:56.304] ...future.value <- base::withVisible(base::local({ [15:31:56.304] ...future.makeSendCondition <- base::local({ [15:31:56.304] sendCondition <- NULL [15:31:56.304] function(frame = 1L) { [15:31:56.304] if (is.function(sendCondition)) [15:31:56.304] return(sendCondition) [15:31:56.304] ns <- getNamespace("parallel") [15:31:56.304] if (exists("sendData", mode = "function", [15:31:56.304] envir = ns)) { [15:31:56.304] parallel_sendData <- get("sendData", mode = "function", [15:31:56.304] envir = ns) [15:31:56.304] envir <- sys.frame(frame) [15:31:56.304] master <- NULL [15:31:56.304] while (!identical(envir, .GlobalEnv) && [15:31:56.304] !identical(envir, emptyenv())) { [15:31:56.304] if (exists("master", mode = "list", envir = envir, [15:31:56.304] inherits = FALSE)) { [15:31:56.304] master <- get("master", mode = "list", [15:31:56.304] envir = envir, inherits = FALSE) [15:31:56.304] if (inherits(master, c("SOCKnode", [15:31:56.304] "SOCK0node"))) { [15:31:56.304] sendCondition <<- function(cond) { [15:31:56.304] data <- list(type = "VALUE", value = cond, [15:31:56.304] success = TRUE) [15:31:56.304] parallel_sendData(master, data) [15:31:56.304] } [15:31:56.304] return(sendCondition) [15:31:56.304] } [15:31:56.304] } [15:31:56.304] frame <- frame + 1L [15:31:56.304] envir <- sys.frame(frame) [15:31:56.304] } [15:31:56.304] } [15:31:56.304] sendCondition <<- function(cond) NULL [15:31:56.304] } [15:31:56.304] }) [15:31:56.304] withCallingHandlers({ [15:31:56.304] { [15:31:56.304] do.call(function(...) { [15:31:56.304] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.304] if (!identical(...future.globals.maxSize.org, [15:31:56.304] ...future.globals.maxSize)) { [15:31:56.304] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.304] on.exit(options(oopts), add = TRUE) [15:31:56.304] } [15:31:56.304] { [15:31:56.304] lapply(seq_along(...future.elements_ii), [15:31:56.304] FUN = function(jj) { [15:31:56.304] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.304] ...future.FUN(...future.X_jj, ...) [15:31:56.304] }) [15:31:56.304] } [15:31:56.304] }, args = future.call.arguments) [15:31:56.304] } [15:31:56.304] }, immediateCondition = function(cond) { [15:31:56.304] sendCondition <- ...future.makeSendCondition() [15:31:56.304] sendCondition(cond) [15:31:56.304] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.304] { [15:31:56.304] inherits <- base::inherits [15:31:56.304] invokeRestart <- base::invokeRestart [15:31:56.304] is.null <- base::is.null [15:31:56.304] muffled <- FALSE [15:31:56.304] if (inherits(cond, "message")) { [15:31:56.304] muffled <- grepl(pattern, "muffleMessage") [15:31:56.304] if (muffled) [15:31:56.304] invokeRestart("muffleMessage") [15:31:56.304] } [15:31:56.304] else if (inherits(cond, "warning")) { [15:31:56.304] muffled <- grepl(pattern, "muffleWarning") [15:31:56.304] if (muffled) [15:31:56.304] invokeRestart("muffleWarning") [15:31:56.304] } [15:31:56.304] else if (inherits(cond, "condition")) { [15:31:56.304] if (!is.null(pattern)) { [15:31:56.304] computeRestarts <- base::computeRestarts [15:31:56.304] grepl <- base::grepl [15:31:56.304] restarts <- computeRestarts(cond) [15:31:56.304] for (restart in restarts) { [15:31:56.304] name <- restart$name [15:31:56.304] if (is.null(name)) [15:31:56.304] next [15:31:56.304] if (!grepl(pattern, name)) [15:31:56.304] next [15:31:56.304] invokeRestart(restart) [15:31:56.304] muffled <- TRUE [15:31:56.304] break [15:31:56.304] } [15:31:56.304] } [15:31:56.304] } [15:31:56.304] invisible(muffled) [15:31:56.304] } [15:31:56.304] muffleCondition(cond) [15:31:56.304] }) [15:31:56.304] })) [15:31:56.304] future::FutureResult(value = ...future.value$value, [15:31:56.304] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:56.304] ...future.rng), globalenv = if (FALSE) [15:31:56.304] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:56.304] ...future.globalenv.names)) [15:31:56.304] else NULL, started = ...future.startTime, version = "1.8") [15:31:56.304] }, condition = base::local({ [15:31:56.304] c <- base::c [15:31:56.304] inherits <- base::inherits [15:31:56.304] invokeRestart <- base::invokeRestart [15:31:56.304] length <- base::length [15:31:56.304] list <- base::list [15:31:56.304] seq.int <- base::seq.int [15:31:56.304] signalCondition <- base::signalCondition [15:31:56.304] sys.calls <- base::sys.calls [15:31:56.304] `[[` <- base::`[[` [15:31:56.304] `+` <- base::`+` [15:31:56.304] `<<-` <- base::`<<-` [15:31:56.304] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:56.304] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:56.304] 3L)] [15:31:56.304] } [15:31:56.304] function(cond) { [15:31:56.304] is_error <- inherits(cond, "error") [15:31:56.304] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:56.304] NULL) [15:31:56.304] if (is_error) { [15:31:56.304] sessionInformation <- function() { [15:31:56.304] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:56.304] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:56.304] search = base::search(), system = base::Sys.info()) [15:31:56.304] } [15:31:56.304] ...future.conditions[[length(...future.conditions) + [15:31:56.304] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:56.304] cond$call), session = sessionInformation(), [15:31:56.304] timestamp = base::Sys.time(), signaled = 0L) [15:31:56.304] signalCondition(cond) [15:31:56.304] } [15:31:56.304] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:56.304] "immediateCondition"))) { [15:31:56.304] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:56.304] ...future.conditions[[length(...future.conditions) + [15:31:56.304] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:56.304] if (TRUE && !signal) { [15:31:56.304] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.304] { [15:31:56.304] inherits <- base::inherits [15:31:56.304] invokeRestart <- base::invokeRestart [15:31:56.304] is.null <- base::is.null [15:31:56.304] muffled <- FALSE [15:31:56.304] if (inherits(cond, "message")) { [15:31:56.304] muffled <- grepl(pattern, "muffleMessage") [15:31:56.304] if (muffled) [15:31:56.304] invokeRestart("muffleMessage") [15:31:56.304] } [15:31:56.304] else if (inherits(cond, "warning")) { [15:31:56.304] muffled <- grepl(pattern, "muffleWarning") [15:31:56.304] if (muffled) [15:31:56.304] invokeRestart("muffleWarning") [15:31:56.304] } [15:31:56.304] else if (inherits(cond, "condition")) { [15:31:56.304] if (!is.null(pattern)) { [15:31:56.304] computeRestarts <- base::computeRestarts [15:31:56.304] grepl <- base::grepl [15:31:56.304] restarts <- computeRestarts(cond) [15:31:56.304] for (restart in restarts) { [15:31:56.304] name <- restart$name [15:31:56.304] if (is.null(name)) [15:31:56.304] next [15:31:56.304] if (!grepl(pattern, name)) [15:31:56.304] next [15:31:56.304] invokeRestart(restart) [15:31:56.304] muffled <- TRUE [15:31:56.304] break [15:31:56.304] } [15:31:56.304] } [15:31:56.304] } [15:31:56.304] invisible(muffled) [15:31:56.304] } [15:31:56.304] muffleCondition(cond, pattern = "^muffle") [15:31:56.304] } [15:31:56.304] } [15:31:56.304] else { [15:31:56.304] if (TRUE) { [15:31:56.304] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.304] { [15:31:56.304] inherits <- base::inherits [15:31:56.304] invokeRestart <- base::invokeRestart [15:31:56.304] is.null <- base::is.null [15:31:56.304] muffled <- FALSE [15:31:56.304] if (inherits(cond, "message")) { [15:31:56.304] muffled <- grepl(pattern, "muffleMessage") [15:31:56.304] if (muffled) [15:31:56.304] invokeRestart("muffleMessage") [15:31:56.304] } [15:31:56.304] else if (inherits(cond, "warning")) { [15:31:56.304] muffled <- grepl(pattern, "muffleWarning") [15:31:56.304] if (muffled) [15:31:56.304] invokeRestart("muffleWarning") [15:31:56.304] } [15:31:56.304] else if (inherits(cond, "condition")) { [15:31:56.304] if (!is.null(pattern)) { [15:31:56.304] computeRestarts <- base::computeRestarts [15:31:56.304] grepl <- base::grepl [15:31:56.304] restarts <- computeRestarts(cond) [15:31:56.304] for (restart in restarts) { [15:31:56.304] name <- restart$name [15:31:56.304] if (is.null(name)) [15:31:56.304] next [15:31:56.304] if (!grepl(pattern, name)) [15:31:56.304] next [15:31:56.304] invokeRestart(restart) [15:31:56.304] muffled <- TRUE [15:31:56.304] break [15:31:56.304] } [15:31:56.304] } [15:31:56.304] } [15:31:56.304] invisible(muffled) [15:31:56.304] } [15:31:56.304] muffleCondition(cond, pattern = "^muffle") [15:31:56.304] } [15:31:56.304] } [15:31:56.304] } [15:31:56.304] })) [15:31:56.304] }, error = function(ex) { [15:31:56.304] base::structure(base::list(value = NULL, visible = NULL, [15:31:56.304] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:56.304] ...future.rng), started = ...future.startTime, [15:31:56.304] finished = Sys.time(), session_uuid = NA_character_, [15:31:56.304] version = "1.8"), class = "FutureResult") [15:31:56.304] }, finally = { [15:31:56.304] if (!identical(...future.workdir, getwd())) [15:31:56.304] setwd(...future.workdir) [15:31:56.304] { [15:31:56.304] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:56.304] ...future.oldOptions$nwarnings <- NULL [15:31:56.304] } [15:31:56.304] base::options(...future.oldOptions) [15:31:56.304] if (.Platform$OS.type == "windows") { [15:31:56.304] old_names <- names(...future.oldEnvVars) [15:31:56.304] envs <- base::Sys.getenv() [15:31:56.304] names <- names(envs) [15:31:56.304] common <- intersect(names, old_names) [15:31:56.304] added <- setdiff(names, old_names) [15:31:56.304] removed <- setdiff(old_names, names) [15:31:56.304] changed <- common[...future.oldEnvVars[common] != [15:31:56.304] envs[common]] [15:31:56.304] NAMES <- toupper(changed) [15:31:56.304] args <- list() [15:31:56.304] for (kk in seq_along(NAMES)) { [15:31:56.304] name <- changed[[kk]] [15:31:56.304] NAME <- NAMES[[kk]] [15:31:56.304] if (name != NAME && is.element(NAME, old_names)) [15:31:56.304] next [15:31:56.304] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:56.304] } [15:31:56.304] NAMES <- toupper(added) [15:31:56.304] for (kk in seq_along(NAMES)) { [15:31:56.304] name <- added[[kk]] [15:31:56.304] NAME <- NAMES[[kk]] [15:31:56.304] if (name != NAME && is.element(NAME, old_names)) [15:31:56.304] next [15:31:56.304] args[[name]] <- "" [15:31:56.304] } [15:31:56.304] NAMES <- toupper(removed) [15:31:56.304] for (kk in seq_along(NAMES)) { [15:31:56.304] name <- removed[[kk]] [15:31:56.304] NAME <- NAMES[[kk]] [15:31:56.304] if (name != NAME && is.element(NAME, old_names)) [15:31:56.304] next [15:31:56.304] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:56.304] } [15:31:56.304] if (length(args) > 0) [15:31:56.304] base::do.call(base::Sys.setenv, args = args) [15:31:56.304] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:56.304] } [15:31:56.304] else { [15:31:56.304] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:56.304] } [15:31:56.304] { [15:31:56.304] if (base::length(...future.futureOptionsAdded) > [15:31:56.304] 0L) { [15:31:56.304] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:56.304] base::names(opts) <- ...future.futureOptionsAdded [15:31:56.304] base::options(opts) [15:31:56.304] } [15:31:56.304] { [15:31:56.304] { [15:31:56.304] base::options(mc.cores = ...future.mc.cores.old) [15:31:56.304] NULL [15:31:56.304] } [15:31:56.304] options(future.plan = NULL) [15:31:56.304] if (is.na(NA_character_)) [15:31:56.304] Sys.unsetenv("R_FUTURE_PLAN") [15:31:56.304] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:56.304] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:56.304] .init = FALSE) [15:31:56.304] } [15:31:56.304] } [15:31:56.304] } [15:31:56.304] }) [15:31:56.304] if (TRUE) { [15:31:56.304] base::sink(type = "output", split = FALSE) [15:31:56.304] if (TRUE) { [15:31:56.304] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:56.304] } [15:31:56.304] else { [15:31:56.304] ...future.result["stdout"] <- base::list(NULL) [15:31:56.304] } [15:31:56.304] base::close(...future.stdout) [15:31:56.304] ...future.stdout <- NULL [15:31:56.304] } [15:31:56.304] ...future.result$conditions <- ...future.conditions [15:31:56.304] ...future.result$finished <- base::Sys.time() [15:31:56.304] ...future.result [15:31:56.304] } [15:31:56.313] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:56.313] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:56.314] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:56.314] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:56.315] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:56.315] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [15:31:56.316] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [15:31:56.316] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:56.317] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:56.317] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:56.318] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:56.318] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:56.319] MultisessionFuture started [15:31:56.319] - Launch lazy future ... done [15:31:56.319] run() for 'MultisessionFuture' ... done [15:31:56.319] Created future: [15:31:56.342] receiveMessageFromWorker() for ClusterFuture ... [15:31:56.342] - Validating connection of MultisessionFuture [15:31:56.343] - received message: FutureResult [15:31:56.343] - Received FutureResult [15:31:56.343] - Erased future from FutureRegistry [15:31:56.344] result() for ClusterFuture ... [15:31:56.344] - result already collected: FutureResult [15:31:56.344] result() for ClusterFuture ... done [15:31:56.344] receiveMessageFromWorker() for ClusterFuture ... done [15:31:56.319] MultisessionFuture: [15:31:56.319] Label: 'future_lapply-2' [15:31:56.319] Expression: [15:31:56.319] { [15:31:56.319] do.call(function(...) { [15:31:56.319] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.319] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:56.319] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.319] on.exit(options(oopts), add = TRUE) [15:31:56.319] } [15:31:56.319] { [15:31:56.319] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:56.319] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.319] ...future.FUN(...future.X_jj, ...) [15:31:56.319] }) [15:31:56.319] } [15:31:56.319] }, args = future.call.arguments) [15:31:56.319] } [15:31:56.319] Lazy evaluation: FALSE [15:31:56.319] Asynchronous evaluation: TRUE [15:31:56.319] Local evaluation: TRUE [15:31:56.319] Environment: R_GlobalEnv [15:31:56.319] Capture standard output: TRUE [15:31:56.319] Capture condition classes: 'condition' (excluding 'nothing') [15:31:56.319] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:56.319] Packages: [15:31:56.319] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:56.319] Resolved: TRUE [15:31:56.319] Value: [15:31:56.319] Conditions captured: [15:31:56.319] Early signaling: FALSE [15:31:56.319] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:56.319] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:56.345] Chunk #2 of 4 ... DONE [15:31:56.345] Chunk #3 of 4 ... [15:31:56.346] - Finding globals in 'X' for chunk #3 ... [15:31:56.346] getGlobalsAndPackages() ... [15:31:56.346] Searching for globals... [15:31:56.347] [15:31:56.347] Searching for globals ... DONE [15:31:56.347] - globals: [0] [15:31:56.347] getGlobalsAndPackages() ... DONE [15:31:56.348] + additional globals found: [n=0] [15:31:56.348] + additional namespaces needed: [n=0] [15:31:56.348] - Finding globals in 'X' for chunk #3 ... DONE [15:31:56.348] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:56.349] - seeds: [15:31:56.349] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.349] getGlobalsAndPackages() ... [15:31:56.349] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.350] Resolving globals: FALSE [15:31:56.350] Tweak future expression to call with '...' arguments ... [15:31:56.350] { [15:31:56.350] do.call(function(...) { [15:31:56.350] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.350] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:56.350] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.350] on.exit(options(oopts), add = TRUE) [15:31:56.350] } [15:31:56.350] { [15:31:56.350] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:56.350] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.350] ...future.FUN(...future.X_jj, ...) [15:31:56.350] }) [15:31:56.350] } [15:31:56.350] }, args = future.call.arguments) [15:31:56.350] } [15:31:56.351] Tweak future expression to call with '...' arguments ... DONE [15:31:56.352] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.352] [15:31:56.352] getGlobalsAndPackages() ... DONE [15:31:56.353] run() for 'Future' ... [15:31:56.353] - state: 'created' [15:31:56.353] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:56.371] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:56.372] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:56.372] - Field: 'node' [15:31:56.372] - Field: 'label' [15:31:56.372] - Field: 'local' [15:31:56.373] - Field: 'owner' [15:31:56.373] - Field: 'envir' [15:31:56.373] - Field: 'workers' [15:31:56.373] - Field: 'packages' [15:31:56.374] - Field: 'gc' [15:31:56.374] - Field: 'conditions' [15:31:56.374] - Field: 'persistent' [15:31:56.374] - Field: 'expr' [15:31:56.375] - Field: 'uuid' [15:31:56.375] - Field: 'seed' [15:31:56.375] - Field: 'version' [15:31:56.376] - Field: 'result' [15:31:56.376] - Field: 'asynchronous' [15:31:56.376] - Field: 'calls' [15:31:56.376] - Field: 'globals' [15:31:56.377] - Field: 'stdout' [15:31:56.377] - Field: 'earlySignal' [15:31:56.377] - Field: 'lazy' [15:31:56.378] - Field: 'state' [15:31:56.378] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:56.378] - Launch lazy future ... [15:31:56.379] Packages needed by the future expression (n = 0): [15:31:56.379] Packages needed by future strategies (n = 0): [15:31:56.380] { [15:31:56.380] { [15:31:56.380] { [15:31:56.380] ...future.startTime <- base::Sys.time() [15:31:56.380] { [15:31:56.380] { [15:31:56.380] { [15:31:56.380] { [15:31:56.380] base::local({ [15:31:56.380] has_future <- base::requireNamespace("future", [15:31:56.380] quietly = TRUE) [15:31:56.380] if (has_future) { [15:31:56.380] ns <- base::getNamespace("future") [15:31:56.380] version <- ns[[".package"]][["version"]] [15:31:56.380] if (is.null(version)) [15:31:56.380] version <- utils::packageVersion("future") [15:31:56.380] } [15:31:56.380] else { [15:31:56.380] version <- NULL [15:31:56.380] } [15:31:56.380] if (!has_future || version < "1.8.0") { [15:31:56.380] info <- base::c(r_version = base::gsub("R version ", [15:31:56.380] "", base::R.version$version.string), [15:31:56.380] platform = base::sprintf("%s (%s-bit)", [15:31:56.380] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:56.380] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:56.380] "release", "version")], collapse = " "), [15:31:56.380] hostname = base::Sys.info()[["nodename"]]) [15:31:56.380] info <- base::sprintf("%s: %s", base::names(info), [15:31:56.380] info) [15:31:56.380] info <- base::paste(info, collapse = "; ") [15:31:56.380] if (!has_future) { [15:31:56.380] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:56.380] info) [15:31:56.380] } [15:31:56.380] else { [15:31:56.380] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:56.380] info, version) [15:31:56.380] } [15:31:56.380] base::stop(msg) [15:31:56.380] } [15:31:56.380] }) [15:31:56.380] } [15:31:56.380] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:56.380] base::options(mc.cores = 1L) [15:31:56.380] } [15:31:56.380] ...future.strategy.old <- future::plan("list") [15:31:56.380] options(future.plan = NULL) [15:31:56.380] Sys.unsetenv("R_FUTURE_PLAN") [15:31:56.380] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:56.380] } [15:31:56.380] ...future.workdir <- getwd() [15:31:56.380] } [15:31:56.380] ...future.oldOptions <- base::as.list(base::.Options) [15:31:56.380] ...future.oldEnvVars <- base::Sys.getenv() [15:31:56.380] } [15:31:56.380] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:56.380] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:56.380] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:56.380] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:56.380] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:56.380] future.stdout.windows.reencode = NULL, width = 80L) [15:31:56.380] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:56.380] base::names(...future.oldOptions)) [15:31:56.380] } [15:31:56.380] if (FALSE) { [15:31:56.380] } [15:31:56.380] else { [15:31:56.380] if (TRUE) { [15:31:56.380] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:56.380] open = "w") [15:31:56.380] } [15:31:56.380] else { [15:31:56.380] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:56.380] windows = "NUL", "/dev/null"), open = "w") [15:31:56.380] } [15:31:56.380] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:56.380] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:56.380] base::sink(type = "output", split = FALSE) [15:31:56.380] base::close(...future.stdout) [15:31:56.380] }, add = TRUE) [15:31:56.380] } [15:31:56.380] ...future.frame <- base::sys.nframe() [15:31:56.380] ...future.conditions <- base::list() [15:31:56.380] ...future.rng <- base::globalenv()$.Random.seed [15:31:56.380] if (FALSE) { [15:31:56.380] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:56.380] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:56.380] } [15:31:56.380] ...future.result <- base::tryCatch({ [15:31:56.380] base::withCallingHandlers({ [15:31:56.380] ...future.value <- base::withVisible(base::local({ [15:31:56.380] ...future.makeSendCondition <- base::local({ [15:31:56.380] sendCondition <- NULL [15:31:56.380] function(frame = 1L) { [15:31:56.380] if (is.function(sendCondition)) [15:31:56.380] return(sendCondition) [15:31:56.380] ns <- getNamespace("parallel") [15:31:56.380] if (exists("sendData", mode = "function", [15:31:56.380] envir = ns)) { [15:31:56.380] parallel_sendData <- get("sendData", mode = "function", [15:31:56.380] envir = ns) [15:31:56.380] envir <- sys.frame(frame) [15:31:56.380] master <- NULL [15:31:56.380] while (!identical(envir, .GlobalEnv) && [15:31:56.380] !identical(envir, emptyenv())) { [15:31:56.380] if (exists("master", mode = "list", envir = envir, [15:31:56.380] inherits = FALSE)) { [15:31:56.380] master <- get("master", mode = "list", [15:31:56.380] envir = envir, inherits = FALSE) [15:31:56.380] if (inherits(master, c("SOCKnode", [15:31:56.380] "SOCK0node"))) { [15:31:56.380] sendCondition <<- function(cond) { [15:31:56.380] data <- list(type = "VALUE", value = cond, [15:31:56.380] success = TRUE) [15:31:56.380] parallel_sendData(master, data) [15:31:56.380] } [15:31:56.380] return(sendCondition) [15:31:56.380] } [15:31:56.380] } [15:31:56.380] frame <- frame + 1L [15:31:56.380] envir <- sys.frame(frame) [15:31:56.380] } [15:31:56.380] } [15:31:56.380] sendCondition <<- function(cond) NULL [15:31:56.380] } [15:31:56.380] }) [15:31:56.380] withCallingHandlers({ [15:31:56.380] { [15:31:56.380] do.call(function(...) { [15:31:56.380] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.380] if (!identical(...future.globals.maxSize.org, [15:31:56.380] ...future.globals.maxSize)) { [15:31:56.380] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.380] on.exit(options(oopts), add = TRUE) [15:31:56.380] } [15:31:56.380] { [15:31:56.380] lapply(seq_along(...future.elements_ii), [15:31:56.380] FUN = function(jj) { [15:31:56.380] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.380] ...future.FUN(...future.X_jj, ...) [15:31:56.380] }) [15:31:56.380] } [15:31:56.380] }, args = future.call.arguments) [15:31:56.380] } [15:31:56.380] }, immediateCondition = function(cond) { [15:31:56.380] sendCondition <- ...future.makeSendCondition() [15:31:56.380] sendCondition(cond) [15:31:56.380] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.380] { [15:31:56.380] inherits <- base::inherits [15:31:56.380] invokeRestart <- base::invokeRestart [15:31:56.380] is.null <- base::is.null [15:31:56.380] muffled <- FALSE [15:31:56.380] if (inherits(cond, "message")) { [15:31:56.380] muffled <- grepl(pattern, "muffleMessage") [15:31:56.380] if (muffled) [15:31:56.380] invokeRestart("muffleMessage") [15:31:56.380] } [15:31:56.380] else if (inherits(cond, "warning")) { [15:31:56.380] muffled <- grepl(pattern, "muffleWarning") [15:31:56.380] if (muffled) [15:31:56.380] invokeRestart("muffleWarning") [15:31:56.380] } [15:31:56.380] else if (inherits(cond, "condition")) { [15:31:56.380] if (!is.null(pattern)) { [15:31:56.380] computeRestarts <- base::computeRestarts [15:31:56.380] grepl <- base::grepl [15:31:56.380] restarts <- computeRestarts(cond) [15:31:56.380] for (restart in restarts) { [15:31:56.380] name <- restart$name [15:31:56.380] if (is.null(name)) [15:31:56.380] next [15:31:56.380] if (!grepl(pattern, name)) [15:31:56.380] next [15:31:56.380] invokeRestart(restart) [15:31:56.380] muffled <- TRUE [15:31:56.380] break [15:31:56.380] } [15:31:56.380] } [15:31:56.380] } [15:31:56.380] invisible(muffled) [15:31:56.380] } [15:31:56.380] muffleCondition(cond) [15:31:56.380] }) [15:31:56.380] })) [15:31:56.380] future::FutureResult(value = ...future.value$value, [15:31:56.380] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:56.380] ...future.rng), globalenv = if (FALSE) [15:31:56.380] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:56.380] ...future.globalenv.names)) [15:31:56.380] else NULL, started = ...future.startTime, version = "1.8") [15:31:56.380] }, condition = base::local({ [15:31:56.380] c <- base::c [15:31:56.380] inherits <- base::inherits [15:31:56.380] invokeRestart <- base::invokeRestart [15:31:56.380] length <- base::length [15:31:56.380] list <- base::list [15:31:56.380] seq.int <- base::seq.int [15:31:56.380] signalCondition <- base::signalCondition [15:31:56.380] sys.calls <- base::sys.calls [15:31:56.380] `[[` <- base::`[[` [15:31:56.380] `+` <- base::`+` [15:31:56.380] `<<-` <- base::`<<-` [15:31:56.380] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:56.380] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:56.380] 3L)] [15:31:56.380] } [15:31:56.380] function(cond) { [15:31:56.380] is_error <- inherits(cond, "error") [15:31:56.380] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:56.380] NULL) [15:31:56.380] if (is_error) { [15:31:56.380] sessionInformation <- function() { [15:31:56.380] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:56.380] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:56.380] search = base::search(), system = base::Sys.info()) [15:31:56.380] } [15:31:56.380] ...future.conditions[[length(...future.conditions) + [15:31:56.380] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:56.380] cond$call), session = sessionInformation(), [15:31:56.380] timestamp = base::Sys.time(), signaled = 0L) [15:31:56.380] signalCondition(cond) [15:31:56.380] } [15:31:56.380] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:56.380] "immediateCondition"))) { [15:31:56.380] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:56.380] ...future.conditions[[length(...future.conditions) + [15:31:56.380] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:56.380] if (TRUE && !signal) { [15:31:56.380] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.380] { [15:31:56.380] inherits <- base::inherits [15:31:56.380] invokeRestart <- base::invokeRestart [15:31:56.380] is.null <- base::is.null [15:31:56.380] muffled <- FALSE [15:31:56.380] if (inherits(cond, "message")) { [15:31:56.380] muffled <- grepl(pattern, "muffleMessage") [15:31:56.380] if (muffled) [15:31:56.380] invokeRestart("muffleMessage") [15:31:56.380] } [15:31:56.380] else if (inherits(cond, "warning")) { [15:31:56.380] muffled <- grepl(pattern, "muffleWarning") [15:31:56.380] if (muffled) [15:31:56.380] invokeRestart("muffleWarning") [15:31:56.380] } [15:31:56.380] else if (inherits(cond, "condition")) { [15:31:56.380] if (!is.null(pattern)) { [15:31:56.380] computeRestarts <- base::computeRestarts [15:31:56.380] grepl <- base::grepl [15:31:56.380] restarts <- computeRestarts(cond) [15:31:56.380] for (restart in restarts) { [15:31:56.380] name <- restart$name [15:31:56.380] if (is.null(name)) [15:31:56.380] next [15:31:56.380] if (!grepl(pattern, name)) [15:31:56.380] next [15:31:56.380] invokeRestart(restart) [15:31:56.380] muffled <- TRUE [15:31:56.380] break [15:31:56.380] } [15:31:56.380] } [15:31:56.380] } [15:31:56.380] invisible(muffled) [15:31:56.380] } [15:31:56.380] muffleCondition(cond, pattern = "^muffle") [15:31:56.380] } [15:31:56.380] } [15:31:56.380] else { [15:31:56.380] if (TRUE) { [15:31:56.380] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.380] { [15:31:56.380] inherits <- base::inherits [15:31:56.380] invokeRestart <- base::invokeRestart [15:31:56.380] is.null <- base::is.null [15:31:56.380] muffled <- FALSE [15:31:56.380] if (inherits(cond, "message")) { [15:31:56.380] muffled <- grepl(pattern, "muffleMessage") [15:31:56.380] if (muffled) [15:31:56.380] invokeRestart("muffleMessage") [15:31:56.380] } [15:31:56.380] else if (inherits(cond, "warning")) { [15:31:56.380] muffled <- grepl(pattern, "muffleWarning") [15:31:56.380] if (muffled) [15:31:56.380] invokeRestart("muffleWarning") [15:31:56.380] } [15:31:56.380] else if (inherits(cond, "condition")) { [15:31:56.380] if (!is.null(pattern)) { [15:31:56.380] computeRestarts <- base::computeRestarts [15:31:56.380] grepl <- base::grepl [15:31:56.380] restarts <- computeRestarts(cond) [15:31:56.380] for (restart in restarts) { [15:31:56.380] name <- restart$name [15:31:56.380] if (is.null(name)) [15:31:56.380] next [15:31:56.380] if (!grepl(pattern, name)) [15:31:56.380] next [15:31:56.380] invokeRestart(restart) [15:31:56.380] muffled <- TRUE [15:31:56.380] break [15:31:56.380] } [15:31:56.380] } [15:31:56.380] } [15:31:56.380] invisible(muffled) [15:31:56.380] } [15:31:56.380] muffleCondition(cond, pattern = "^muffle") [15:31:56.380] } [15:31:56.380] } [15:31:56.380] } [15:31:56.380] })) [15:31:56.380] }, error = function(ex) { [15:31:56.380] base::structure(base::list(value = NULL, visible = NULL, [15:31:56.380] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:56.380] ...future.rng), started = ...future.startTime, [15:31:56.380] finished = Sys.time(), session_uuid = NA_character_, [15:31:56.380] version = "1.8"), class = "FutureResult") [15:31:56.380] }, finally = { [15:31:56.380] if (!identical(...future.workdir, getwd())) [15:31:56.380] setwd(...future.workdir) [15:31:56.380] { [15:31:56.380] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:56.380] ...future.oldOptions$nwarnings <- NULL [15:31:56.380] } [15:31:56.380] base::options(...future.oldOptions) [15:31:56.380] if (.Platform$OS.type == "windows") { [15:31:56.380] old_names <- names(...future.oldEnvVars) [15:31:56.380] envs <- base::Sys.getenv() [15:31:56.380] names <- names(envs) [15:31:56.380] common <- intersect(names, old_names) [15:31:56.380] added <- setdiff(names, old_names) [15:31:56.380] removed <- setdiff(old_names, names) [15:31:56.380] changed <- common[...future.oldEnvVars[common] != [15:31:56.380] envs[common]] [15:31:56.380] NAMES <- toupper(changed) [15:31:56.380] args <- list() [15:31:56.380] for (kk in seq_along(NAMES)) { [15:31:56.380] name <- changed[[kk]] [15:31:56.380] NAME <- NAMES[[kk]] [15:31:56.380] if (name != NAME && is.element(NAME, old_names)) [15:31:56.380] next [15:31:56.380] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:56.380] } [15:31:56.380] NAMES <- toupper(added) [15:31:56.380] for (kk in seq_along(NAMES)) { [15:31:56.380] name <- added[[kk]] [15:31:56.380] NAME <- NAMES[[kk]] [15:31:56.380] if (name != NAME && is.element(NAME, old_names)) [15:31:56.380] next [15:31:56.380] args[[name]] <- "" [15:31:56.380] } [15:31:56.380] NAMES <- toupper(removed) [15:31:56.380] for (kk in seq_along(NAMES)) { [15:31:56.380] name <- removed[[kk]] [15:31:56.380] NAME <- NAMES[[kk]] [15:31:56.380] if (name != NAME && is.element(NAME, old_names)) [15:31:56.380] next [15:31:56.380] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:56.380] } [15:31:56.380] if (length(args) > 0) [15:31:56.380] base::do.call(base::Sys.setenv, args = args) [15:31:56.380] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:56.380] } [15:31:56.380] else { [15:31:56.380] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:56.380] } [15:31:56.380] { [15:31:56.380] if (base::length(...future.futureOptionsAdded) > [15:31:56.380] 0L) { [15:31:56.380] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:56.380] base::names(opts) <- ...future.futureOptionsAdded [15:31:56.380] base::options(opts) [15:31:56.380] } [15:31:56.380] { [15:31:56.380] { [15:31:56.380] base::options(mc.cores = ...future.mc.cores.old) [15:31:56.380] NULL [15:31:56.380] } [15:31:56.380] options(future.plan = NULL) [15:31:56.380] if (is.na(NA_character_)) [15:31:56.380] Sys.unsetenv("R_FUTURE_PLAN") [15:31:56.380] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:56.380] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:56.380] .init = FALSE) [15:31:56.380] } [15:31:56.380] } [15:31:56.380] } [15:31:56.380] }) [15:31:56.380] if (TRUE) { [15:31:56.380] base::sink(type = "output", split = FALSE) [15:31:56.380] if (TRUE) { [15:31:56.380] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:56.380] } [15:31:56.380] else { [15:31:56.380] ...future.result["stdout"] <- base::list(NULL) [15:31:56.380] } [15:31:56.380] base::close(...future.stdout) [15:31:56.380] ...future.stdout <- NULL [15:31:56.380] } [15:31:56.380] ...future.result$conditions <- ...future.conditions [15:31:56.380] ...future.result$finished <- base::Sys.time() [15:31:56.380] ...future.result [15:31:56.380] } [15:31:56.388] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:56.388] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:56.389] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:56.389] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:56.390] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:56.390] Exporting '...future.elements_ii' (120 bytes) to cluster node #1 ... [15:31:56.391] Exporting '...future.elements_ii' (120 bytes) to cluster node #1 ... DONE [15:31:56.391] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:56.392] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:56.392] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:56.392] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:56.393] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:56.394] MultisessionFuture started [15:31:56.394] - Launch lazy future ... done [15:31:56.394] run() for 'MultisessionFuture' ... done [15:31:56.394] Created future: [15:31:56.419] receiveMessageFromWorker() for ClusterFuture ... [15:31:56.420] - Validating connection of MultisessionFuture [15:31:56.420] - received message: FutureResult [15:31:56.420] - Received FutureResult [15:31:56.421] - Erased future from FutureRegistry [15:31:56.421] result() for ClusterFuture ... [15:31:56.421] - result already collected: FutureResult [15:31:56.421] result() for ClusterFuture ... done [15:31:56.422] receiveMessageFromWorker() for ClusterFuture ... done [15:31:56.394] MultisessionFuture: [15:31:56.394] Label: 'future_lapply-3' [15:31:56.394] Expression: [15:31:56.394] { [15:31:56.394] do.call(function(...) { [15:31:56.394] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.394] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:56.394] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.394] on.exit(options(oopts), add = TRUE) [15:31:56.394] } [15:31:56.394] { [15:31:56.394] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:56.394] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.394] ...future.FUN(...future.X_jj, ...) [15:31:56.394] }) [15:31:56.394] } [15:31:56.394] }, args = future.call.arguments) [15:31:56.394] } [15:31:56.394] Lazy evaluation: FALSE [15:31:56.394] Asynchronous evaluation: TRUE [15:31:56.394] Local evaluation: TRUE [15:31:56.394] Environment: R_GlobalEnv [15:31:56.394] Capture standard output: TRUE [15:31:56.394] Capture condition classes: 'condition' (excluding 'nothing') [15:31:56.394] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 120 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:56.394] Packages: [15:31:56.394] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:56.394] Resolved: TRUE [15:31:56.394] Value: [15:31:56.394] Conditions captured: [15:31:56.394] Early signaling: FALSE [15:31:56.394] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:56.394] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:56.423] Chunk #3 of 4 ... DONE [15:31:56.423] Chunk #4 of 4 ... [15:31:56.423] - Finding globals in 'X' for chunk #4 ... [15:31:56.423] getGlobalsAndPackages() ... [15:31:56.424] Searching for globals... [15:31:56.424] [15:31:56.424] Searching for globals ... DONE [15:31:56.425] - globals: [0] [15:31:56.425] getGlobalsAndPackages() ... DONE [15:31:56.425] + additional globals found: [n=0] [15:31:56.425] + additional namespaces needed: [n=0] [15:31:56.426] - Finding globals in 'X' for chunk #4 ... DONE [15:31:56.426] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:56.426] - seeds: [15:31:56.426] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.427] getGlobalsAndPackages() ... [15:31:56.427] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.427] Resolving globals: FALSE [15:31:56.428] Tweak future expression to call with '...' arguments ... [15:31:56.428] { [15:31:56.428] do.call(function(...) { [15:31:56.428] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.428] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:56.428] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.428] on.exit(options(oopts), add = TRUE) [15:31:56.428] } [15:31:56.428] { [15:31:56.428] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:56.428] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.428] ...future.FUN(...future.X_jj, ...) [15:31:56.428] }) [15:31:56.428] } [15:31:56.428] }, args = future.call.arguments) [15:31:56.428] } [15:31:56.429] Tweak future expression to call with '...' arguments ... DONE [15:31:56.430] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.430] [15:31:56.430] getGlobalsAndPackages() ... DONE [15:31:56.431] run() for 'Future' ... [15:31:56.431] - state: 'created' [15:31:56.432] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:56.448] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:56.448] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:56.449] - Field: 'node' [15:31:56.449] - Field: 'label' [15:31:56.449] - Field: 'local' [15:31:56.449] - Field: 'owner' [15:31:56.450] - Field: 'envir' [15:31:56.450] - Field: 'workers' [15:31:56.450] - Field: 'packages' [15:31:56.451] - Field: 'gc' [15:31:56.451] - Field: 'conditions' [15:31:56.451] - Field: 'persistent' [15:31:56.451] - Field: 'expr' [15:31:56.452] - Field: 'uuid' [15:31:56.452] - Field: 'seed' [15:31:56.452] - Field: 'version' [15:31:56.452] - Field: 'result' [15:31:56.453] - Field: 'asynchronous' [15:31:56.453] - Field: 'calls' [15:31:56.453] - Field: 'globals' [15:31:56.454] - Field: 'stdout' [15:31:56.454] - Field: 'earlySignal' [15:31:56.454] - Field: 'lazy' [15:31:56.454] - Field: 'state' [15:31:56.455] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:56.455] - Launch lazy future ... [15:31:56.455] Packages needed by the future expression (n = 0): [15:31:56.456] Packages needed by future strategies (n = 0): [15:31:56.457] { [15:31:56.457] { [15:31:56.457] { [15:31:56.457] ...future.startTime <- base::Sys.time() [15:31:56.457] { [15:31:56.457] { [15:31:56.457] { [15:31:56.457] { [15:31:56.457] base::local({ [15:31:56.457] has_future <- base::requireNamespace("future", [15:31:56.457] quietly = TRUE) [15:31:56.457] if (has_future) { [15:31:56.457] ns <- base::getNamespace("future") [15:31:56.457] version <- ns[[".package"]][["version"]] [15:31:56.457] if (is.null(version)) [15:31:56.457] version <- utils::packageVersion("future") [15:31:56.457] } [15:31:56.457] else { [15:31:56.457] version <- NULL [15:31:56.457] } [15:31:56.457] if (!has_future || version < "1.8.0") { [15:31:56.457] info <- base::c(r_version = base::gsub("R version ", [15:31:56.457] "", base::R.version$version.string), [15:31:56.457] platform = base::sprintf("%s (%s-bit)", [15:31:56.457] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:56.457] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:56.457] "release", "version")], collapse = " "), [15:31:56.457] hostname = base::Sys.info()[["nodename"]]) [15:31:56.457] info <- base::sprintf("%s: %s", base::names(info), [15:31:56.457] info) [15:31:56.457] info <- base::paste(info, collapse = "; ") [15:31:56.457] if (!has_future) { [15:31:56.457] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:56.457] info) [15:31:56.457] } [15:31:56.457] else { [15:31:56.457] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:56.457] info, version) [15:31:56.457] } [15:31:56.457] base::stop(msg) [15:31:56.457] } [15:31:56.457] }) [15:31:56.457] } [15:31:56.457] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:56.457] base::options(mc.cores = 1L) [15:31:56.457] } [15:31:56.457] ...future.strategy.old <- future::plan("list") [15:31:56.457] options(future.plan = NULL) [15:31:56.457] Sys.unsetenv("R_FUTURE_PLAN") [15:31:56.457] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:56.457] } [15:31:56.457] ...future.workdir <- getwd() [15:31:56.457] } [15:31:56.457] ...future.oldOptions <- base::as.list(base::.Options) [15:31:56.457] ...future.oldEnvVars <- base::Sys.getenv() [15:31:56.457] } [15:31:56.457] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:56.457] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:56.457] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:56.457] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:56.457] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:56.457] future.stdout.windows.reencode = NULL, width = 80L) [15:31:56.457] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:56.457] base::names(...future.oldOptions)) [15:31:56.457] } [15:31:56.457] if (FALSE) { [15:31:56.457] } [15:31:56.457] else { [15:31:56.457] if (TRUE) { [15:31:56.457] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:56.457] open = "w") [15:31:56.457] } [15:31:56.457] else { [15:31:56.457] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:56.457] windows = "NUL", "/dev/null"), open = "w") [15:31:56.457] } [15:31:56.457] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:56.457] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:56.457] base::sink(type = "output", split = FALSE) [15:31:56.457] base::close(...future.stdout) [15:31:56.457] }, add = TRUE) [15:31:56.457] } [15:31:56.457] ...future.frame <- base::sys.nframe() [15:31:56.457] ...future.conditions <- base::list() [15:31:56.457] ...future.rng <- base::globalenv()$.Random.seed [15:31:56.457] if (FALSE) { [15:31:56.457] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:56.457] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:56.457] } [15:31:56.457] ...future.result <- base::tryCatch({ [15:31:56.457] base::withCallingHandlers({ [15:31:56.457] ...future.value <- base::withVisible(base::local({ [15:31:56.457] ...future.makeSendCondition <- base::local({ [15:31:56.457] sendCondition <- NULL [15:31:56.457] function(frame = 1L) { [15:31:56.457] if (is.function(sendCondition)) [15:31:56.457] return(sendCondition) [15:31:56.457] ns <- getNamespace("parallel") [15:31:56.457] if (exists("sendData", mode = "function", [15:31:56.457] envir = ns)) { [15:31:56.457] parallel_sendData <- get("sendData", mode = "function", [15:31:56.457] envir = ns) [15:31:56.457] envir <- sys.frame(frame) [15:31:56.457] master <- NULL [15:31:56.457] while (!identical(envir, .GlobalEnv) && [15:31:56.457] !identical(envir, emptyenv())) { [15:31:56.457] if (exists("master", mode = "list", envir = envir, [15:31:56.457] inherits = FALSE)) { [15:31:56.457] master <- get("master", mode = "list", [15:31:56.457] envir = envir, inherits = FALSE) [15:31:56.457] if (inherits(master, c("SOCKnode", [15:31:56.457] "SOCK0node"))) { [15:31:56.457] sendCondition <<- function(cond) { [15:31:56.457] data <- list(type = "VALUE", value = cond, [15:31:56.457] success = TRUE) [15:31:56.457] parallel_sendData(master, data) [15:31:56.457] } [15:31:56.457] return(sendCondition) [15:31:56.457] } [15:31:56.457] } [15:31:56.457] frame <- frame + 1L [15:31:56.457] envir <- sys.frame(frame) [15:31:56.457] } [15:31:56.457] } [15:31:56.457] sendCondition <<- function(cond) NULL [15:31:56.457] } [15:31:56.457] }) [15:31:56.457] withCallingHandlers({ [15:31:56.457] { [15:31:56.457] do.call(function(...) { [15:31:56.457] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.457] if (!identical(...future.globals.maxSize.org, [15:31:56.457] ...future.globals.maxSize)) { [15:31:56.457] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.457] on.exit(options(oopts), add = TRUE) [15:31:56.457] } [15:31:56.457] { [15:31:56.457] lapply(seq_along(...future.elements_ii), [15:31:56.457] FUN = function(jj) { [15:31:56.457] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.457] ...future.FUN(...future.X_jj, ...) [15:31:56.457] }) [15:31:56.457] } [15:31:56.457] }, args = future.call.arguments) [15:31:56.457] } [15:31:56.457] }, immediateCondition = function(cond) { [15:31:56.457] sendCondition <- ...future.makeSendCondition() [15:31:56.457] sendCondition(cond) [15:31:56.457] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.457] { [15:31:56.457] inherits <- base::inherits [15:31:56.457] invokeRestart <- base::invokeRestart [15:31:56.457] is.null <- base::is.null [15:31:56.457] muffled <- FALSE [15:31:56.457] if (inherits(cond, "message")) { [15:31:56.457] muffled <- grepl(pattern, "muffleMessage") [15:31:56.457] if (muffled) [15:31:56.457] invokeRestart("muffleMessage") [15:31:56.457] } [15:31:56.457] else if (inherits(cond, "warning")) { [15:31:56.457] muffled <- grepl(pattern, "muffleWarning") [15:31:56.457] if (muffled) [15:31:56.457] invokeRestart("muffleWarning") [15:31:56.457] } [15:31:56.457] else if (inherits(cond, "condition")) { [15:31:56.457] if (!is.null(pattern)) { [15:31:56.457] computeRestarts <- base::computeRestarts [15:31:56.457] grepl <- base::grepl [15:31:56.457] restarts <- computeRestarts(cond) [15:31:56.457] for (restart in restarts) { [15:31:56.457] name <- restart$name [15:31:56.457] if (is.null(name)) [15:31:56.457] next [15:31:56.457] if (!grepl(pattern, name)) [15:31:56.457] next [15:31:56.457] invokeRestart(restart) [15:31:56.457] muffled <- TRUE [15:31:56.457] break [15:31:56.457] } [15:31:56.457] } [15:31:56.457] } [15:31:56.457] invisible(muffled) [15:31:56.457] } [15:31:56.457] muffleCondition(cond) [15:31:56.457] }) [15:31:56.457] })) [15:31:56.457] future::FutureResult(value = ...future.value$value, [15:31:56.457] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:56.457] ...future.rng), globalenv = if (FALSE) [15:31:56.457] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:56.457] ...future.globalenv.names)) [15:31:56.457] else NULL, started = ...future.startTime, version = "1.8") [15:31:56.457] }, condition = base::local({ [15:31:56.457] c <- base::c [15:31:56.457] inherits <- base::inherits [15:31:56.457] invokeRestart <- base::invokeRestart [15:31:56.457] length <- base::length [15:31:56.457] list <- base::list [15:31:56.457] seq.int <- base::seq.int [15:31:56.457] signalCondition <- base::signalCondition [15:31:56.457] sys.calls <- base::sys.calls [15:31:56.457] `[[` <- base::`[[` [15:31:56.457] `+` <- base::`+` [15:31:56.457] `<<-` <- base::`<<-` [15:31:56.457] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:56.457] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:56.457] 3L)] [15:31:56.457] } [15:31:56.457] function(cond) { [15:31:56.457] is_error <- inherits(cond, "error") [15:31:56.457] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:56.457] NULL) [15:31:56.457] if (is_error) { [15:31:56.457] sessionInformation <- function() { [15:31:56.457] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:56.457] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:56.457] search = base::search(), system = base::Sys.info()) [15:31:56.457] } [15:31:56.457] ...future.conditions[[length(...future.conditions) + [15:31:56.457] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:56.457] cond$call), session = sessionInformation(), [15:31:56.457] timestamp = base::Sys.time(), signaled = 0L) [15:31:56.457] signalCondition(cond) [15:31:56.457] } [15:31:56.457] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:56.457] "immediateCondition"))) { [15:31:56.457] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:56.457] ...future.conditions[[length(...future.conditions) + [15:31:56.457] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:56.457] if (TRUE && !signal) { [15:31:56.457] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.457] { [15:31:56.457] inherits <- base::inherits [15:31:56.457] invokeRestart <- base::invokeRestart [15:31:56.457] is.null <- base::is.null [15:31:56.457] muffled <- FALSE [15:31:56.457] if (inherits(cond, "message")) { [15:31:56.457] muffled <- grepl(pattern, "muffleMessage") [15:31:56.457] if (muffled) [15:31:56.457] invokeRestart("muffleMessage") [15:31:56.457] } [15:31:56.457] else if (inherits(cond, "warning")) { [15:31:56.457] muffled <- grepl(pattern, "muffleWarning") [15:31:56.457] if (muffled) [15:31:56.457] invokeRestart("muffleWarning") [15:31:56.457] } [15:31:56.457] else if (inherits(cond, "condition")) { [15:31:56.457] if (!is.null(pattern)) { [15:31:56.457] computeRestarts <- base::computeRestarts [15:31:56.457] grepl <- base::grepl [15:31:56.457] restarts <- computeRestarts(cond) [15:31:56.457] for (restart in restarts) { [15:31:56.457] name <- restart$name [15:31:56.457] if (is.null(name)) [15:31:56.457] next [15:31:56.457] if (!grepl(pattern, name)) [15:31:56.457] next [15:31:56.457] invokeRestart(restart) [15:31:56.457] muffled <- TRUE [15:31:56.457] break [15:31:56.457] } [15:31:56.457] } [15:31:56.457] } [15:31:56.457] invisible(muffled) [15:31:56.457] } [15:31:56.457] muffleCondition(cond, pattern = "^muffle") [15:31:56.457] } [15:31:56.457] } [15:31:56.457] else { [15:31:56.457] if (TRUE) { [15:31:56.457] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.457] { [15:31:56.457] inherits <- base::inherits [15:31:56.457] invokeRestart <- base::invokeRestart [15:31:56.457] is.null <- base::is.null [15:31:56.457] muffled <- FALSE [15:31:56.457] if (inherits(cond, "message")) { [15:31:56.457] muffled <- grepl(pattern, "muffleMessage") [15:31:56.457] if (muffled) [15:31:56.457] invokeRestart("muffleMessage") [15:31:56.457] } [15:31:56.457] else if (inherits(cond, "warning")) { [15:31:56.457] muffled <- grepl(pattern, "muffleWarning") [15:31:56.457] if (muffled) [15:31:56.457] invokeRestart("muffleWarning") [15:31:56.457] } [15:31:56.457] else if (inherits(cond, "condition")) { [15:31:56.457] if (!is.null(pattern)) { [15:31:56.457] computeRestarts <- base::computeRestarts [15:31:56.457] grepl <- base::grepl [15:31:56.457] restarts <- computeRestarts(cond) [15:31:56.457] for (restart in restarts) { [15:31:56.457] name <- restart$name [15:31:56.457] if (is.null(name)) [15:31:56.457] next [15:31:56.457] if (!grepl(pattern, name)) [15:31:56.457] next [15:31:56.457] invokeRestart(restart) [15:31:56.457] muffled <- TRUE [15:31:56.457] break [15:31:56.457] } [15:31:56.457] } [15:31:56.457] } [15:31:56.457] invisible(muffled) [15:31:56.457] } [15:31:56.457] muffleCondition(cond, pattern = "^muffle") [15:31:56.457] } [15:31:56.457] } [15:31:56.457] } [15:31:56.457] })) [15:31:56.457] }, error = function(ex) { [15:31:56.457] base::structure(base::list(value = NULL, visible = NULL, [15:31:56.457] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:56.457] ...future.rng), started = ...future.startTime, [15:31:56.457] finished = Sys.time(), session_uuid = NA_character_, [15:31:56.457] version = "1.8"), class = "FutureResult") [15:31:56.457] }, finally = { [15:31:56.457] if (!identical(...future.workdir, getwd())) [15:31:56.457] setwd(...future.workdir) [15:31:56.457] { [15:31:56.457] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:56.457] ...future.oldOptions$nwarnings <- NULL [15:31:56.457] } [15:31:56.457] base::options(...future.oldOptions) [15:31:56.457] if (.Platform$OS.type == "windows") { [15:31:56.457] old_names <- names(...future.oldEnvVars) [15:31:56.457] envs <- base::Sys.getenv() [15:31:56.457] names <- names(envs) [15:31:56.457] common <- intersect(names, old_names) [15:31:56.457] added <- setdiff(names, old_names) [15:31:56.457] removed <- setdiff(old_names, names) [15:31:56.457] changed <- common[...future.oldEnvVars[common] != [15:31:56.457] envs[common]] [15:31:56.457] NAMES <- toupper(changed) [15:31:56.457] args <- list() [15:31:56.457] for (kk in seq_along(NAMES)) { [15:31:56.457] name <- changed[[kk]] [15:31:56.457] NAME <- NAMES[[kk]] [15:31:56.457] if (name != NAME && is.element(NAME, old_names)) [15:31:56.457] next [15:31:56.457] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:56.457] } [15:31:56.457] NAMES <- toupper(added) [15:31:56.457] for (kk in seq_along(NAMES)) { [15:31:56.457] name <- added[[kk]] [15:31:56.457] NAME <- NAMES[[kk]] [15:31:56.457] if (name != NAME && is.element(NAME, old_names)) [15:31:56.457] next [15:31:56.457] args[[name]] <- "" [15:31:56.457] } [15:31:56.457] NAMES <- toupper(removed) [15:31:56.457] for (kk in seq_along(NAMES)) { [15:31:56.457] name <- removed[[kk]] [15:31:56.457] NAME <- NAMES[[kk]] [15:31:56.457] if (name != NAME && is.element(NAME, old_names)) [15:31:56.457] next [15:31:56.457] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:56.457] } [15:31:56.457] if (length(args) > 0) [15:31:56.457] base::do.call(base::Sys.setenv, args = args) [15:31:56.457] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:56.457] } [15:31:56.457] else { [15:31:56.457] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:56.457] } [15:31:56.457] { [15:31:56.457] if (base::length(...future.futureOptionsAdded) > [15:31:56.457] 0L) { [15:31:56.457] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:56.457] base::names(opts) <- ...future.futureOptionsAdded [15:31:56.457] base::options(opts) [15:31:56.457] } [15:31:56.457] { [15:31:56.457] { [15:31:56.457] base::options(mc.cores = ...future.mc.cores.old) [15:31:56.457] NULL [15:31:56.457] } [15:31:56.457] options(future.plan = NULL) [15:31:56.457] if (is.na(NA_character_)) [15:31:56.457] Sys.unsetenv("R_FUTURE_PLAN") [15:31:56.457] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:56.457] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:56.457] .init = FALSE) [15:31:56.457] } [15:31:56.457] } [15:31:56.457] } [15:31:56.457] }) [15:31:56.457] if (TRUE) { [15:31:56.457] base::sink(type = "output", split = FALSE) [15:31:56.457] if (TRUE) { [15:31:56.457] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:56.457] } [15:31:56.457] else { [15:31:56.457] ...future.result["stdout"] <- base::list(NULL) [15:31:56.457] } [15:31:56.457] base::close(...future.stdout) [15:31:56.457] ...future.stdout <- NULL [15:31:56.457] } [15:31:56.457] ...future.result$conditions <- ...future.conditions [15:31:56.457] ...future.result$finished <- base::Sys.time() [15:31:56.457] ...future.result [15:31:56.457] } [15:31:56.465] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:56.466] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:56.466] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:56.467] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:56.467] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:56.468] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [15:31:56.468] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [15:31:56.469] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:56.469] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:56.470] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:56.470] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:56.471] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:56.472] MultisessionFuture started [15:31:56.472] - Launch lazy future ... done [15:31:56.472] run() for 'MultisessionFuture' ... done [15:31:56.472] Created future: [15:31:56.499] receiveMessageFromWorker() for ClusterFuture ... [15:31:56.500] - Validating connection of MultisessionFuture [15:31:56.501] - received message: FutureResult [15:31:56.501] - Received FutureResult [15:31:56.501] - Erased future from FutureRegistry [15:31:56.502] result() for ClusterFuture ... [15:31:56.502] - result already collected: FutureResult [15:31:56.502] result() for ClusterFuture ... done [15:31:56.502] receiveMessageFromWorker() for ClusterFuture ... done [15:31:56.473] MultisessionFuture: [15:31:56.473] Label: 'future_lapply-4' [15:31:56.473] Expression: [15:31:56.473] { [15:31:56.473] do.call(function(...) { [15:31:56.473] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.473] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:56.473] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.473] on.exit(options(oopts), add = TRUE) [15:31:56.473] } [15:31:56.473] { [15:31:56.473] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:56.473] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.473] ...future.FUN(...future.X_jj, ...) [15:31:56.473] }) [15:31:56.473] } [15:31:56.473] }, args = future.call.arguments) [15:31:56.473] } [15:31:56.473] Lazy evaluation: FALSE [15:31:56.473] Asynchronous evaluation: TRUE [15:31:56.473] Local evaluation: TRUE [15:31:56.473] Environment: R_GlobalEnv [15:31:56.473] Capture standard output: TRUE [15:31:56.473] Capture condition classes: 'condition' (excluding 'nothing') [15:31:56.473] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:56.473] Packages: [15:31:56.473] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:56.473] Resolved: TRUE [15:31:56.473] Value: [15:31:56.473] Conditions captured: [15:31:56.473] Early signaling: FALSE [15:31:56.473] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:56.473] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:56.503] Chunk #4 of 4 ... DONE [15:31:56.504] Launching 4 futures (chunks) ... DONE [15:31:56.504] Resolving 4 futures (chunks) ... [15:31:56.504] resolve() on list ... [15:31:56.504] recursive: 0 [15:31:56.505] length: 4 [15:31:56.505] [15:31:56.505] Future #1 [15:31:56.506] result() for ClusterFuture ... [15:31:56.506] - result already collected: FutureResult [15:31:56.506] result() for ClusterFuture ... done [15:31:56.506] result() for ClusterFuture ... [15:31:56.507] - result already collected: FutureResult [15:31:56.507] result() for ClusterFuture ... done [15:31:56.507] signalConditionsASAP(MultisessionFuture, pos=1) ... [15:31:56.507] - nx: 4 [15:31:56.508] - relay: TRUE [15:31:56.508] - stdout: TRUE [15:31:56.508] - signal: TRUE [15:31:56.508] - resignal: FALSE [15:31:56.509] - force: TRUE [15:31:56.509] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [15:31:56.509] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [15:31:56.510] - until=1 [15:31:56.510] - relaying element #1 [15:31:56.510] result() for ClusterFuture ... [15:31:56.510] - result already collected: FutureResult [15:31:56.511] result() for ClusterFuture ... done [15:31:56.511] result() for ClusterFuture ... [15:31:56.511] - result already collected: FutureResult [15:31:56.511] result() for ClusterFuture ... done [15:31:56.512] result() for ClusterFuture ... [15:31:56.512] - result already collected: FutureResult [15:31:56.512] result() for ClusterFuture ... done [15:31:56.513] result() for ClusterFuture ... [15:31:56.513] - result already collected: FutureResult [15:31:56.513] result() for ClusterFuture ... done [15:31:56.513] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:56.514] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:56.514] signalConditionsASAP(MultisessionFuture, pos=1) ... done [15:31:56.514] length: 3 (resolved future 1) [15:31:56.515] Future #2 [15:31:56.515] result() for ClusterFuture ... [15:31:56.515] - result already collected: FutureResult [15:31:56.516] result() for ClusterFuture ... done [15:31:56.516] result() for ClusterFuture ... [15:31:56.516] - result already collected: FutureResult [15:31:56.516] result() for ClusterFuture ... done [15:31:56.517] signalConditionsASAP(MultisessionFuture, pos=2) ... [15:31:56.517] - nx: 4 [15:31:56.517] - relay: TRUE [15:31:56.517] - stdout: TRUE [15:31:56.518] - signal: TRUE [15:31:56.518] - resignal: FALSE [15:31:56.518] - force: TRUE [15:31:56.518] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:56.519] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:56.519] - until=2 [15:31:56.519] - relaying element #2 [15:31:56.520] result() for ClusterFuture ... [15:31:56.520] - result already collected: FutureResult [15:31:56.520] result() for ClusterFuture ... done [15:31:56.520] result() for ClusterFuture ... [15:31:56.521] - result already collected: FutureResult [15:31:56.521] result() for ClusterFuture ... done [15:31:56.521] result() for ClusterFuture ... [15:31:56.522] - result already collected: FutureResult [15:31:56.522] result() for ClusterFuture ... done [15:31:56.522] result() for ClusterFuture ... [15:31:56.522] - result already collected: FutureResult [15:31:56.523] result() for ClusterFuture ... done [15:31:56.523] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:56.523] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:56.524] signalConditionsASAP(MultisessionFuture, pos=2) ... done [15:31:56.524] length: 2 (resolved future 2) [15:31:56.524] Future #3 [15:31:56.525] result() for ClusterFuture ... [15:31:56.525] - result already collected: FutureResult [15:31:56.525] result() for ClusterFuture ... done [15:31:56.525] result() for ClusterFuture ... [15:31:56.526] - result already collected: FutureResult [15:31:56.526] result() for ClusterFuture ... done [15:31:56.526] signalConditionsASAP(MultisessionFuture, pos=3) ... [15:31:56.526] - nx: 4 [15:31:56.527] - relay: TRUE [15:31:56.527] - stdout: TRUE [15:31:56.527] - signal: TRUE [15:31:56.527] - resignal: FALSE [15:31:56.528] - force: TRUE [15:31:56.528] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:56.528] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:56.529] - until=3 [15:31:56.529] - relaying element #3 [15:31:56.529] result() for ClusterFuture ... [15:31:56.529] - result already collected: FutureResult [15:31:56.530] result() for ClusterFuture ... done [15:31:56.530] result() for ClusterFuture ... [15:31:56.530] - result already collected: FutureResult [15:31:56.530] result() for ClusterFuture ... done [15:31:56.531] result() for ClusterFuture ... [15:31:56.531] - result already collected: FutureResult [15:31:56.531] result() for ClusterFuture ... done [15:31:56.532] result() for ClusterFuture ... [15:31:56.532] - result already collected: FutureResult [15:31:56.532] result() for ClusterFuture ... done [15:31:56.532] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:56.533] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:56.533] signalConditionsASAP(MultisessionFuture, pos=3) ... done [15:31:56.533] length: 1 (resolved future 3) [15:31:56.534] Future #4 [15:31:56.534] result() for ClusterFuture ... [15:31:56.534] - result already collected: FutureResult [15:31:56.535] result() for ClusterFuture ... done [15:31:56.535] result() for ClusterFuture ... [15:31:56.535] - result already collected: FutureResult [15:31:56.535] result() for ClusterFuture ... done [15:31:56.536] signalConditionsASAP(MultisessionFuture, pos=4) ... [15:31:56.536] - nx: 4 [15:31:56.536] - relay: TRUE [15:31:56.536] - stdout: TRUE [15:31:56.537] - signal: TRUE [15:31:56.537] - resignal: FALSE [15:31:56.537] - force: TRUE [15:31:56.537] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:56.538] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:56.538] - until=4 [15:31:56.538] - relaying element #4 [15:31:56.539] result() for ClusterFuture ... [15:31:56.539] - result already collected: FutureResult [15:31:56.539] result() for ClusterFuture ... done [15:31:56.539] result() for ClusterFuture ... [15:31:56.540] - result already collected: FutureResult [15:31:56.540] result() for ClusterFuture ... done [15:31:56.540] result() for ClusterFuture ... [15:31:56.541] - result already collected: FutureResult [15:31:56.541] result() for ClusterFuture ... done [15:31:56.541] result() for ClusterFuture ... [15:31:56.541] - result already collected: FutureResult [15:31:56.542] result() for ClusterFuture ... done [15:31:56.542] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:56.542] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:56.543] signalConditionsASAP(MultisessionFuture, pos=4) ... done [15:31:56.543] length: 0 (resolved future 4) [15:31:56.543] Relaying remaining futures [15:31:56.543] signalConditionsASAP(NULL, pos=0) ... [15:31:56.544] - nx: 4 [15:31:56.544] - relay: TRUE [15:31:56.544] - stdout: TRUE [15:31:56.544] - signal: TRUE [15:31:56.545] - resignal: FALSE [15:31:56.545] - force: TRUE [15:31:56.545] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:56.546] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [15:31:56.546] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:56.546] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:56.547] signalConditionsASAP(NULL, pos=0) ... done [15:31:56.547] resolve() on list ... DONE [15:31:56.547] result() for ClusterFuture ... [15:31:56.547] - result already collected: FutureResult [15:31:56.548] result() for ClusterFuture ... done [15:31:56.548] result() for ClusterFuture ... [15:31:56.548] - result already collected: FutureResult [15:31:56.548] result() for ClusterFuture ... done [15:31:56.549] result() for ClusterFuture ... [15:31:56.549] - result already collected: FutureResult [15:31:56.549] result() for ClusterFuture ... done [15:31:56.550] result() for ClusterFuture ... [15:31:56.550] - result already collected: FutureResult [15:31:56.550] result() for ClusterFuture ... done [15:31:56.551] result() for ClusterFuture ... [15:31:56.551] - result already collected: FutureResult [15:31:56.551] result() for ClusterFuture ... done [15:31:56.551] result() for ClusterFuture ... [15:31:56.552] - result already collected: FutureResult [15:31:56.552] result() for ClusterFuture ... done [15:31:56.552] result() for ClusterFuture ... [15:31:56.552] - result already collected: FutureResult [15:31:56.553] result() for ClusterFuture ... done [15:31:56.553] result() for ClusterFuture ... [15:31:56.553] - result already collected: FutureResult [15:31:56.554] result() for ClusterFuture ... done [15:31:56.554] - Number of value chunks collected: 4 [15:31:56.554] Resolving 4 futures (chunks) ... DONE [15:31:56.554] Reducing values from 4 chunks ... [15:31:56.555] - Number of values collected after concatenation: 4 [15:31:56.555] - Number of values expected: 4 [15:31:56.555] Reducing values from 4 chunks ... DONE [15:31:56.556] 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, ...) ... [15:31:56.560] future_lapply() ... [15:31:56.566] Number of chunks: 4 [15:31:56.566] getGlobalsAndPackagesXApply() ... [15:31:56.566] - future.globals: TRUE [15:31:56.567] getGlobalsAndPackages() ... [15:31:56.567] Searching for globals... [15:31:56.569] - globals found: [2] 'FUN', '.Internal' [15:31:56.570] Searching for globals ... DONE [15:31:56.570] Resolving globals: FALSE [15:31:56.571] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:56.572] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:56.572] - globals: [1] 'FUN' [15:31:56.572] [15:31:56.573] getGlobalsAndPackages() ... DONE [15:31:56.573] - globals found/used: [n=1] 'FUN' [15:31:56.573] - needed namespaces: [n=0] [15:31:56.573] Finding globals ... DONE [15:31:56.574] - use_args: TRUE [15:31:56.574] - Getting '...' globals ... [15:31:56.575] resolve() on list ... [15:31:56.575] recursive: 0 [15:31:56.579] length: 1 [15:31:56.579] elements: '...' [15:31:56.580] length: 0 (resolved future 1) [15:31:56.580] resolve() on list ... DONE [15:31:56.580] - '...' content: [n=1] 'length' [15:31:56.581] List of 1 [15:31:56.581] $ ...:List of 1 [15:31:56.581] ..$ length: int 2 [15:31:56.581] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:56.581] - attr(*, "where")=List of 1 [15:31:56.581] ..$ ...: [15:31:56.581] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:56.581] - attr(*, "resolved")= logi TRUE [15:31:56.581] - attr(*, "total_size")= num NA [15:31:56.587] - Getting '...' globals ... DONE [15:31:56.587] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:56.588] List of 2 [15:31:56.588] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:56.588] $ ... :List of 1 [15:31:56.588] ..$ length: int 2 [15:31:56.588] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:56.588] - attr(*, "where")=List of 2 [15:31:56.588] ..$ ...future.FUN: [15:31:56.588] ..$ ... : [15:31:56.588] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:56.588] - attr(*, "resolved")= logi FALSE [15:31:56.588] - attr(*, "total_size")= num 2240 [15:31:56.594] Packages to be attached in all futures: [n=0] [15:31:56.594] getGlobalsAndPackagesXApply() ... DONE [15:31:56.595] Number of futures (= number of chunks): 4 [15:31:56.595] Launching 4 futures (chunks) ... [15:31:56.595] Chunk #1 of 4 ... [15:31:56.596] - Finding globals in 'X' for chunk #1 ... [15:31:56.596] getGlobalsAndPackages() ... [15:31:56.596] Searching for globals... [15:31:56.597] [15:31:56.597] Searching for globals ... DONE [15:31:56.597] - globals: [0] [15:31:56.598] getGlobalsAndPackages() ... DONE [15:31:56.598] + additional globals found: [n=0] [15:31:56.598] + additional namespaces needed: [n=0] [15:31:56.598] - Finding globals in 'X' for chunk #1 ... DONE [15:31:56.599] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:56.599] - seeds: [15:31:56.599] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.600] getGlobalsAndPackages() ... [15:31:56.600] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.600] Resolving globals: FALSE [15:31:56.600] Tweak future expression to call with '...' arguments ... [15:31:56.601] { [15:31:56.601] do.call(function(...) { [15:31:56.601] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.601] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:56.601] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.601] on.exit(options(oopts), add = TRUE) [15:31:56.601] } [15:31:56.601] { [15:31:56.601] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:56.601] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.601] ...future.FUN(...future.X_jj, ...) [15:31:56.601] }) [15:31:56.601] } [15:31:56.601] }, args = future.call.arguments) [15:31:56.601] } [15:31:56.602] Tweak future expression to call with '...' arguments ... DONE [15:31:56.602] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.603] [15:31:56.603] getGlobalsAndPackages() ... DONE [15:31:56.604] run() for 'Future' ... [15:31:56.604] - state: 'created' [15:31:56.604] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:56.625] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:56.625] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:56.626] - Field: 'node' [15:31:56.626] - Field: 'label' [15:31:56.626] - Field: 'local' [15:31:56.627] - Field: 'owner' [15:31:56.627] - Field: 'envir' [15:31:56.627] - Field: 'workers' [15:31:56.628] - Field: 'packages' [15:31:56.628] - Field: 'gc' [15:31:56.628] - Field: 'conditions' [15:31:56.628] - Field: 'persistent' [15:31:56.629] - Field: 'expr' [15:31:56.629] - Field: 'uuid' [15:31:56.629] - Field: 'seed' [15:31:56.630] - Field: 'version' [15:31:56.630] - Field: 'result' [15:31:56.630] - Field: 'asynchronous' [15:31:56.631] - Field: 'calls' [15:31:56.631] - Field: 'globals' [15:31:56.631] - Field: 'stdout' [15:31:56.631] - Field: 'earlySignal' [15:31:56.632] - Field: 'lazy' [15:31:56.632] - Field: 'state' [15:31:56.632] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:56.633] - Launch lazy future ... [15:31:56.633] Packages needed by the future expression (n = 0): [15:31:56.634] Packages needed by future strategies (n = 0): [15:31:56.635] { [15:31:56.635] { [15:31:56.635] { [15:31:56.635] ...future.startTime <- base::Sys.time() [15:31:56.635] { [15:31:56.635] { [15:31:56.635] { [15:31:56.635] { [15:31:56.635] base::local({ [15:31:56.635] has_future <- base::requireNamespace("future", [15:31:56.635] quietly = TRUE) [15:31:56.635] if (has_future) { [15:31:56.635] ns <- base::getNamespace("future") [15:31:56.635] version <- ns[[".package"]][["version"]] [15:31:56.635] if (is.null(version)) [15:31:56.635] version <- utils::packageVersion("future") [15:31:56.635] } [15:31:56.635] else { [15:31:56.635] version <- NULL [15:31:56.635] } [15:31:56.635] if (!has_future || version < "1.8.0") { [15:31:56.635] info <- base::c(r_version = base::gsub("R version ", [15:31:56.635] "", base::R.version$version.string), [15:31:56.635] platform = base::sprintf("%s (%s-bit)", [15:31:56.635] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:56.635] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:56.635] "release", "version")], collapse = " "), [15:31:56.635] hostname = base::Sys.info()[["nodename"]]) [15:31:56.635] info <- base::sprintf("%s: %s", base::names(info), [15:31:56.635] info) [15:31:56.635] info <- base::paste(info, collapse = "; ") [15:31:56.635] if (!has_future) { [15:31:56.635] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:56.635] info) [15:31:56.635] } [15:31:56.635] else { [15:31:56.635] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:56.635] info, version) [15:31:56.635] } [15:31:56.635] base::stop(msg) [15:31:56.635] } [15:31:56.635] }) [15:31:56.635] } [15:31:56.635] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:56.635] base::options(mc.cores = 1L) [15:31:56.635] } [15:31:56.635] ...future.strategy.old <- future::plan("list") [15:31:56.635] options(future.plan = NULL) [15:31:56.635] Sys.unsetenv("R_FUTURE_PLAN") [15:31:56.635] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:56.635] } [15:31:56.635] ...future.workdir <- getwd() [15:31:56.635] } [15:31:56.635] ...future.oldOptions <- base::as.list(base::.Options) [15:31:56.635] ...future.oldEnvVars <- base::Sys.getenv() [15:31:56.635] } [15:31:56.635] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:56.635] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:56.635] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:56.635] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:56.635] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:56.635] future.stdout.windows.reencode = NULL, width = 80L) [15:31:56.635] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:56.635] base::names(...future.oldOptions)) [15:31:56.635] } [15:31:56.635] if (FALSE) { [15:31:56.635] } [15:31:56.635] else { [15:31:56.635] if (TRUE) { [15:31:56.635] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:56.635] open = "w") [15:31:56.635] } [15:31:56.635] else { [15:31:56.635] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:56.635] windows = "NUL", "/dev/null"), open = "w") [15:31:56.635] } [15:31:56.635] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:56.635] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:56.635] base::sink(type = "output", split = FALSE) [15:31:56.635] base::close(...future.stdout) [15:31:56.635] }, add = TRUE) [15:31:56.635] } [15:31:56.635] ...future.frame <- base::sys.nframe() [15:31:56.635] ...future.conditions <- base::list() [15:31:56.635] ...future.rng <- base::globalenv()$.Random.seed [15:31:56.635] if (FALSE) { [15:31:56.635] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:56.635] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:56.635] } [15:31:56.635] ...future.result <- base::tryCatch({ [15:31:56.635] base::withCallingHandlers({ [15:31:56.635] ...future.value <- base::withVisible(base::local({ [15:31:56.635] ...future.makeSendCondition <- base::local({ [15:31:56.635] sendCondition <- NULL [15:31:56.635] function(frame = 1L) { [15:31:56.635] if (is.function(sendCondition)) [15:31:56.635] return(sendCondition) [15:31:56.635] ns <- getNamespace("parallel") [15:31:56.635] if (exists("sendData", mode = "function", [15:31:56.635] envir = ns)) { [15:31:56.635] parallel_sendData <- get("sendData", mode = "function", [15:31:56.635] envir = ns) [15:31:56.635] envir <- sys.frame(frame) [15:31:56.635] master <- NULL [15:31:56.635] while (!identical(envir, .GlobalEnv) && [15:31:56.635] !identical(envir, emptyenv())) { [15:31:56.635] if (exists("master", mode = "list", envir = envir, [15:31:56.635] inherits = FALSE)) { [15:31:56.635] master <- get("master", mode = "list", [15:31:56.635] envir = envir, inherits = FALSE) [15:31:56.635] if (inherits(master, c("SOCKnode", [15:31:56.635] "SOCK0node"))) { [15:31:56.635] sendCondition <<- function(cond) { [15:31:56.635] data <- list(type = "VALUE", value = cond, [15:31:56.635] success = TRUE) [15:31:56.635] parallel_sendData(master, data) [15:31:56.635] } [15:31:56.635] return(sendCondition) [15:31:56.635] } [15:31:56.635] } [15:31:56.635] frame <- frame + 1L [15:31:56.635] envir <- sys.frame(frame) [15:31:56.635] } [15:31:56.635] } [15:31:56.635] sendCondition <<- function(cond) NULL [15:31:56.635] } [15:31:56.635] }) [15:31:56.635] withCallingHandlers({ [15:31:56.635] { [15:31:56.635] do.call(function(...) { [15:31:56.635] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.635] if (!identical(...future.globals.maxSize.org, [15:31:56.635] ...future.globals.maxSize)) { [15:31:56.635] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.635] on.exit(options(oopts), add = TRUE) [15:31:56.635] } [15:31:56.635] { [15:31:56.635] lapply(seq_along(...future.elements_ii), [15:31:56.635] FUN = function(jj) { [15:31:56.635] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.635] ...future.FUN(...future.X_jj, ...) [15:31:56.635] }) [15:31:56.635] } [15:31:56.635] }, args = future.call.arguments) [15:31:56.635] } [15:31:56.635] }, immediateCondition = function(cond) { [15:31:56.635] sendCondition <- ...future.makeSendCondition() [15:31:56.635] sendCondition(cond) [15:31:56.635] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.635] { [15:31:56.635] inherits <- base::inherits [15:31:56.635] invokeRestart <- base::invokeRestart [15:31:56.635] is.null <- base::is.null [15:31:56.635] muffled <- FALSE [15:31:56.635] if (inherits(cond, "message")) { [15:31:56.635] muffled <- grepl(pattern, "muffleMessage") [15:31:56.635] if (muffled) [15:31:56.635] invokeRestart("muffleMessage") [15:31:56.635] } [15:31:56.635] else if (inherits(cond, "warning")) { [15:31:56.635] muffled <- grepl(pattern, "muffleWarning") [15:31:56.635] if (muffled) [15:31:56.635] invokeRestart("muffleWarning") [15:31:56.635] } [15:31:56.635] else if (inherits(cond, "condition")) { [15:31:56.635] if (!is.null(pattern)) { [15:31:56.635] computeRestarts <- base::computeRestarts [15:31:56.635] grepl <- base::grepl [15:31:56.635] restarts <- computeRestarts(cond) [15:31:56.635] for (restart in restarts) { [15:31:56.635] name <- restart$name [15:31:56.635] if (is.null(name)) [15:31:56.635] next [15:31:56.635] if (!grepl(pattern, name)) [15:31:56.635] next [15:31:56.635] invokeRestart(restart) [15:31:56.635] muffled <- TRUE [15:31:56.635] break [15:31:56.635] } [15:31:56.635] } [15:31:56.635] } [15:31:56.635] invisible(muffled) [15:31:56.635] } [15:31:56.635] muffleCondition(cond) [15:31:56.635] }) [15:31:56.635] })) [15:31:56.635] future::FutureResult(value = ...future.value$value, [15:31:56.635] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:56.635] ...future.rng), globalenv = if (FALSE) [15:31:56.635] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:56.635] ...future.globalenv.names)) [15:31:56.635] else NULL, started = ...future.startTime, version = "1.8") [15:31:56.635] }, condition = base::local({ [15:31:56.635] c <- base::c [15:31:56.635] inherits <- base::inherits [15:31:56.635] invokeRestart <- base::invokeRestart [15:31:56.635] length <- base::length [15:31:56.635] list <- base::list [15:31:56.635] seq.int <- base::seq.int [15:31:56.635] signalCondition <- base::signalCondition [15:31:56.635] sys.calls <- base::sys.calls [15:31:56.635] `[[` <- base::`[[` [15:31:56.635] `+` <- base::`+` [15:31:56.635] `<<-` <- base::`<<-` [15:31:56.635] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:56.635] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:56.635] 3L)] [15:31:56.635] } [15:31:56.635] function(cond) { [15:31:56.635] is_error <- inherits(cond, "error") [15:31:56.635] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:56.635] NULL) [15:31:56.635] if (is_error) { [15:31:56.635] sessionInformation <- function() { [15:31:56.635] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:56.635] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:56.635] search = base::search(), system = base::Sys.info()) [15:31:56.635] } [15:31:56.635] ...future.conditions[[length(...future.conditions) + [15:31:56.635] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:56.635] cond$call), session = sessionInformation(), [15:31:56.635] timestamp = base::Sys.time(), signaled = 0L) [15:31:56.635] signalCondition(cond) [15:31:56.635] } [15:31:56.635] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:56.635] "immediateCondition"))) { [15:31:56.635] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:56.635] ...future.conditions[[length(...future.conditions) + [15:31:56.635] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:56.635] if (TRUE && !signal) { [15:31:56.635] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.635] { [15:31:56.635] inherits <- base::inherits [15:31:56.635] invokeRestart <- base::invokeRestart [15:31:56.635] is.null <- base::is.null [15:31:56.635] muffled <- FALSE [15:31:56.635] if (inherits(cond, "message")) { [15:31:56.635] muffled <- grepl(pattern, "muffleMessage") [15:31:56.635] if (muffled) [15:31:56.635] invokeRestart("muffleMessage") [15:31:56.635] } [15:31:56.635] else if (inherits(cond, "warning")) { [15:31:56.635] muffled <- grepl(pattern, "muffleWarning") [15:31:56.635] if (muffled) [15:31:56.635] invokeRestart("muffleWarning") [15:31:56.635] } [15:31:56.635] else if (inherits(cond, "condition")) { [15:31:56.635] if (!is.null(pattern)) { [15:31:56.635] computeRestarts <- base::computeRestarts [15:31:56.635] grepl <- base::grepl [15:31:56.635] restarts <- computeRestarts(cond) [15:31:56.635] for (restart in restarts) { [15:31:56.635] name <- restart$name [15:31:56.635] if (is.null(name)) [15:31:56.635] next [15:31:56.635] if (!grepl(pattern, name)) [15:31:56.635] next [15:31:56.635] invokeRestart(restart) [15:31:56.635] muffled <- TRUE [15:31:56.635] break [15:31:56.635] } [15:31:56.635] } [15:31:56.635] } [15:31:56.635] invisible(muffled) [15:31:56.635] } [15:31:56.635] muffleCondition(cond, pattern = "^muffle") [15:31:56.635] } [15:31:56.635] } [15:31:56.635] else { [15:31:56.635] if (TRUE) { [15:31:56.635] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.635] { [15:31:56.635] inherits <- base::inherits [15:31:56.635] invokeRestart <- base::invokeRestart [15:31:56.635] is.null <- base::is.null [15:31:56.635] muffled <- FALSE [15:31:56.635] if (inherits(cond, "message")) { [15:31:56.635] muffled <- grepl(pattern, "muffleMessage") [15:31:56.635] if (muffled) [15:31:56.635] invokeRestart("muffleMessage") [15:31:56.635] } [15:31:56.635] else if (inherits(cond, "warning")) { [15:31:56.635] muffled <- grepl(pattern, "muffleWarning") [15:31:56.635] if (muffled) [15:31:56.635] invokeRestart("muffleWarning") [15:31:56.635] } [15:31:56.635] else if (inherits(cond, "condition")) { [15:31:56.635] if (!is.null(pattern)) { [15:31:56.635] computeRestarts <- base::computeRestarts [15:31:56.635] grepl <- base::grepl [15:31:56.635] restarts <- computeRestarts(cond) [15:31:56.635] for (restart in restarts) { [15:31:56.635] name <- restart$name [15:31:56.635] if (is.null(name)) [15:31:56.635] next [15:31:56.635] if (!grepl(pattern, name)) [15:31:56.635] next [15:31:56.635] invokeRestart(restart) [15:31:56.635] muffled <- TRUE [15:31:56.635] break [15:31:56.635] } [15:31:56.635] } [15:31:56.635] } [15:31:56.635] invisible(muffled) [15:31:56.635] } [15:31:56.635] muffleCondition(cond, pattern = "^muffle") [15:31:56.635] } [15:31:56.635] } [15:31:56.635] } [15:31:56.635] })) [15:31:56.635] }, error = function(ex) { [15:31:56.635] base::structure(base::list(value = NULL, visible = NULL, [15:31:56.635] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:56.635] ...future.rng), started = ...future.startTime, [15:31:56.635] finished = Sys.time(), session_uuid = NA_character_, [15:31:56.635] version = "1.8"), class = "FutureResult") [15:31:56.635] }, finally = { [15:31:56.635] if (!identical(...future.workdir, getwd())) [15:31:56.635] setwd(...future.workdir) [15:31:56.635] { [15:31:56.635] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:56.635] ...future.oldOptions$nwarnings <- NULL [15:31:56.635] } [15:31:56.635] base::options(...future.oldOptions) [15:31:56.635] if (.Platform$OS.type == "windows") { [15:31:56.635] old_names <- names(...future.oldEnvVars) [15:31:56.635] envs <- base::Sys.getenv() [15:31:56.635] names <- names(envs) [15:31:56.635] common <- intersect(names, old_names) [15:31:56.635] added <- setdiff(names, old_names) [15:31:56.635] removed <- setdiff(old_names, names) [15:31:56.635] changed <- common[...future.oldEnvVars[common] != [15:31:56.635] envs[common]] [15:31:56.635] NAMES <- toupper(changed) [15:31:56.635] args <- list() [15:31:56.635] for (kk in seq_along(NAMES)) { [15:31:56.635] name <- changed[[kk]] [15:31:56.635] NAME <- NAMES[[kk]] [15:31:56.635] if (name != NAME && is.element(NAME, old_names)) [15:31:56.635] next [15:31:56.635] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:56.635] } [15:31:56.635] NAMES <- toupper(added) [15:31:56.635] for (kk in seq_along(NAMES)) { [15:31:56.635] name <- added[[kk]] [15:31:56.635] NAME <- NAMES[[kk]] [15:31:56.635] if (name != NAME && is.element(NAME, old_names)) [15:31:56.635] next [15:31:56.635] args[[name]] <- "" [15:31:56.635] } [15:31:56.635] NAMES <- toupper(removed) [15:31:56.635] for (kk in seq_along(NAMES)) { [15:31:56.635] name <- removed[[kk]] [15:31:56.635] NAME <- NAMES[[kk]] [15:31:56.635] if (name != NAME && is.element(NAME, old_names)) [15:31:56.635] next [15:31:56.635] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:56.635] } [15:31:56.635] if (length(args) > 0) [15:31:56.635] base::do.call(base::Sys.setenv, args = args) [15:31:56.635] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:56.635] } [15:31:56.635] else { [15:31:56.635] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:56.635] } [15:31:56.635] { [15:31:56.635] if (base::length(...future.futureOptionsAdded) > [15:31:56.635] 0L) { [15:31:56.635] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:56.635] base::names(opts) <- ...future.futureOptionsAdded [15:31:56.635] base::options(opts) [15:31:56.635] } [15:31:56.635] { [15:31:56.635] { [15:31:56.635] base::options(mc.cores = ...future.mc.cores.old) [15:31:56.635] NULL [15:31:56.635] } [15:31:56.635] options(future.plan = NULL) [15:31:56.635] if (is.na(NA_character_)) [15:31:56.635] Sys.unsetenv("R_FUTURE_PLAN") [15:31:56.635] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:56.635] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:56.635] .init = FALSE) [15:31:56.635] } [15:31:56.635] } [15:31:56.635] } [15:31:56.635] }) [15:31:56.635] if (TRUE) { [15:31:56.635] base::sink(type = "output", split = FALSE) [15:31:56.635] if (TRUE) { [15:31:56.635] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:56.635] } [15:31:56.635] else { [15:31:56.635] ...future.result["stdout"] <- base::list(NULL) [15:31:56.635] } [15:31:56.635] base::close(...future.stdout) [15:31:56.635] ...future.stdout <- NULL [15:31:56.635] } [15:31:56.635] ...future.result$conditions <- ...future.conditions [15:31:56.635] ...future.result$finished <- base::Sys.time() [15:31:56.635] ...future.result [15:31:56.635] } [15:31:56.644] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:56.645] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:56.645] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:56.646] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:56.646] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:56.647] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [15:31:56.647] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [15:31:56.648] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:56.648] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:56.649] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:56.650] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:56.650] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:56.651] MultisessionFuture started [15:31:56.652] - Launch lazy future ... done [15:31:56.652] run() for 'MultisessionFuture' ... done [15:31:56.652] Created future: [15:31:56.681] receiveMessageFromWorker() for ClusterFuture ... [15:31:56.681] - Validating connection of MultisessionFuture [15:31:56.682] - received message: FutureResult [15:31:56.682] - Received FutureResult [15:31:56.682] - Erased future from FutureRegistry [15:31:56.683] result() for ClusterFuture ... [15:31:56.683] - result already collected: FutureResult [15:31:56.683] result() for ClusterFuture ... done [15:31:56.683] receiveMessageFromWorker() for ClusterFuture ... done [15:31:56.653] MultisessionFuture: [15:31:56.653] Label: 'future_lapply-1' [15:31:56.653] Expression: [15:31:56.653] { [15:31:56.653] do.call(function(...) { [15:31:56.653] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.653] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:56.653] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.653] on.exit(options(oopts), add = TRUE) [15:31:56.653] } [15:31:56.653] { [15:31:56.653] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:56.653] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.653] ...future.FUN(...future.X_jj, ...) [15:31:56.653] }) [15:31:56.653] } [15:31:56.653] }, args = future.call.arguments) [15:31:56.653] } [15:31:56.653] Lazy evaluation: FALSE [15:31:56.653] Asynchronous evaluation: TRUE [15:31:56.653] Local evaluation: TRUE [15:31:56.653] Environment: R_GlobalEnv [15:31:56.653] Capture standard output: TRUE [15:31:56.653] Capture condition classes: 'condition' (excluding 'nothing') [15:31:56.653] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:56.653] Packages: [15:31:56.653] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:56.653] Resolved: TRUE [15:31:56.653] Value: [15:31:56.653] Conditions captured: [15:31:56.653] Early signaling: FALSE [15:31:56.653] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:56.653] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:56.684] Chunk #1 of 4 ... DONE [15:31:56.684] Chunk #2 of 4 ... [15:31:56.685] - Finding globals in 'X' for chunk #2 ... [15:31:56.685] getGlobalsAndPackages() ... [15:31:56.685] Searching for globals... [15:31:56.686] [15:31:56.686] Searching for globals ... DONE [15:31:56.686] - globals: [0] [15:31:56.686] getGlobalsAndPackages() ... DONE [15:31:56.687] + additional globals found: [n=0] [15:31:56.687] + additional namespaces needed: [n=0] [15:31:56.687] - Finding globals in 'X' for chunk #2 ... DONE [15:31:56.687] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:56.688] - seeds: [15:31:56.688] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.688] getGlobalsAndPackages() ... [15:31:56.689] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.689] Resolving globals: FALSE [15:31:56.689] Tweak future expression to call with '...' arguments ... [15:31:56.689] { [15:31:56.689] do.call(function(...) { [15:31:56.689] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.689] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:56.689] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.689] on.exit(options(oopts), add = TRUE) [15:31:56.689] } [15:31:56.689] { [15:31:56.689] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:56.689] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.689] ...future.FUN(...future.X_jj, ...) [15:31:56.689] }) [15:31:56.689] } [15:31:56.689] }, args = future.call.arguments) [15:31:56.689] } [15:31:56.690] Tweak future expression to call with '...' arguments ... DONE [15:31:56.691] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.691] [15:31:56.691] getGlobalsAndPackages() ... DONE [15:31:56.692] run() for 'Future' ... [15:31:56.692] - state: 'created' [15:31:56.693] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:56.712] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:56.713] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:56.713] - Field: 'node' [15:31:56.713] - Field: 'label' [15:31:56.714] - Field: 'local' [15:31:56.714] - Field: 'owner' [15:31:56.714] - Field: 'envir' [15:31:56.715] - Field: 'workers' [15:31:56.715] - Field: 'packages' [15:31:56.715] - Field: 'gc' [15:31:56.716] - Field: 'conditions' [15:31:56.716] - Field: 'persistent' [15:31:56.716] - Field: 'expr' [15:31:56.717] - Field: 'uuid' [15:31:56.717] - Field: 'seed' [15:31:56.717] - Field: 'version' [15:31:56.718] - Field: 'result' [15:31:56.718] - Field: 'asynchronous' [15:31:56.718] - Field: 'calls' [15:31:56.719] - Field: 'globals' [15:31:56.719] - Field: 'stdout' [15:31:56.719] - Field: 'earlySignal' [15:31:56.720] - Field: 'lazy' [15:31:56.720] - Field: 'state' [15:31:56.720] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:56.720] - Launch lazy future ... [15:31:56.721] Packages needed by the future expression (n = 0): [15:31:56.722] Packages needed by future strategies (n = 0): [15:31:56.723] { [15:31:56.723] { [15:31:56.723] { [15:31:56.723] ...future.startTime <- base::Sys.time() [15:31:56.723] { [15:31:56.723] { [15:31:56.723] { [15:31:56.723] { [15:31:56.723] base::local({ [15:31:56.723] has_future <- base::requireNamespace("future", [15:31:56.723] quietly = TRUE) [15:31:56.723] if (has_future) { [15:31:56.723] ns <- base::getNamespace("future") [15:31:56.723] version <- ns[[".package"]][["version"]] [15:31:56.723] if (is.null(version)) [15:31:56.723] version <- utils::packageVersion("future") [15:31:56.723] } [15:31:56.723] else { [15:31:56.723] version <- NULL [15:31:56.723] } [15:31:56.723] if (!has_future || version < "1.8.0") { [15:31:56.723] info <- base::c(r_version = base::gsub("R version ", [15:31:56.723] "", base::R.version$version.string), [15:31:56.723] platform = base::sprintf("%s (%s-bit)", [15:31:56.723] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:56.723] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:56.723] "release", "version")], collapse = " "), [15:31:56.723] hostname = base::Sys.info()[["nodename"]]) [15:31:56.723] info <- base::sprintf("%s: %s", base::names(info), [15:31:56.723] info) [15:31:56.723] info <- base::paste(info, collapse = "; ") [15:31:56.723] if (!has_future) { [15:31:56.723] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:56.723] info) [15:31:56.723] } [15:31:56.723] else { [15:31:56.723] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:56.723] info, version) [15:31:56.723] } [15:31:56.723] base::stop(msg) [15:31:56.723] } [15:31:56.723] }) [15:31:56.723] } [15:31:56.723] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:56.723] base::options(mc.cores = 1L) [15:31:56.723] } [15:31:56.723] ...future.strategy.old <- future::plan("list") [15:31:56.723] options(future.plan = NULL) [15:31:56.723] Sys.unsetenv("R_FUTURE_PLAN") [15:31:56.723] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:56.723] } [15:31:56.723] ...future.workdir <- getwd() [15:31:56.723] } [15:31:56.723] ...future.oldOptions <- base::as.list(base::.Options) [15:31:56.723] ...future.oldEnvVars <- base::Sys.getenv() [15:31:56.723] } [15:31:56.723] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:56.723] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:56.723] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:56.723] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:56.723] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:56.723] future.stdout.windows.reencode = NULL, width = 80L) [15:31:56.723] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:56.723] base::names(...future.oldOptions)) [15:31:56.723] } [15:31:56.723] if (FALSE) { [15:31:56.723] } [15:31:56.723] else { [15:31:56.723] if (TRUE) { [15:31:56.723] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:56.723] open = "w") [15:31:56.723] } [15:31:56.723] else { [15:31:56.723] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:56.723] windows = "NUL", "/dev/null"), open = "w") [15:31:56.723] } [15:31:56.723] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:56.723] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:56.723] base::sink(type = "output", split = FALSE) [15:31:56.723] base::close(...future.stdout) [15:31:56.723] }, add = TRUE) [15:31:56.723] } [15:31:56.723] ...future.frame <- base::sys.nframe() [15:31:56.723] ...future.conditions <- base::list() [15:31:56.723] ...future.rng <- base::globalenv()$.Random.seed [15:31:56.723] if (FALSE) { [15:31:56.723] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:56.723] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:56.723] } [15:31:56.723] ...future.result <- base::tryCatch({ [15:31:56.723] base::withCallingHandlers({ [15:31:56.723] ...future.value <- base::withVisible(base::local({ [15:31:56.723] ...future.makeSendCondition <- base::local({ [15:31:56.723] sendCondition <- NULL [15:31:56.723] function(frame = 1L) { [15:31:56.723] if (is.function(sendCondition)) [15:31:56.723] return(sendCondition) [15:31:56.723] ns <- getNamespace("parallel") [15:31:56.723] if (exists("sendData", mode = "function", [15:31:56.723] envir = ns)) { [15:31:56.723] parallel_sendData <- get("sendData", mode = "function", [15:31:56.723] envir = ns) [15:31:56.723] envir <- sys.frame(frame) [15:31:56.723] master <- NULL [15:31:56.723] while (!identical(envir, .GlobalEnv) && [15:31:56.723] !identical(envir, emptyenv())) { [15:31:56.723] if (exists("master", mode = "list", envir = envir, [15:31:56.723] inherits = FALSE)) { [15:31:56.723] master <- get("master", mode = "list", [15:31:56.723] envir = envir, inherits = FALSE) [15:31:56.723] if (inherits(master, c("SOCKnode", [15:31:56.723] "SOCK0node"))) { [15:31:56.723] sendCondition <<- function(cond) { [15:31:56.723] data <- list(type = "VALUE", value = cond, [15:31:56.723] success = TRUE) [15:31:56.723] parallel_sendData(master, data) [15:31:56.723] } [15:31:56.723] return(sendCondition) [15:31:56.723] } [15:31:56.723] } [15:31:56.723] frame <- frame + 1L [15:31:56.723] envir <- sys.frame(frame) [15:31:56.723] } [15:31:56.723] } [15:31:56.723] sendCondition <<- function(cond) NULL [15:31:56.723] } [15:31:56.723] }) [15:31:56.723] withCallingHandlers({ [15:31:56.723] { [15:31:56.723] do.call(function(...) { [15:31:56.723] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.723] if (!identical(...future.globals.maxSize.org, [15:31:56.723] ...future.globals.maxSize)) { [15:31:56.723] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.723] on.exit(options(oopts), add = TRUE) [15:31:56.723] } [15:31:56.723] { [15:31:56.723] lapply(seq_along(...future.elements_ii), [15:31:56.723] FUN = function(jj) { [15:31:56.723] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.723] ...future.FUN(...future.X_jj, ...) [15:31:56.723] }) [15:31:56.723] } [15:31:56.723] }, args = future.call.arguments) [15:31:56.723] } [15:31:56.723] }, immediateCondition = function(cond) { [15:31:56.723] sendCondition <- ...future.makeSendCondition() [15:31:56.723] sendCondition(cond) [15:31:56.723] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.723] { [15:31:56.723] inherits <- base::inherits [15:31:56.723] invokeRestart <- base::invokeRestart [15:31:56.723] is.null <- base::is.null [15:31:56.723] muffled <- FALSE [15:31:56.723] if (inherits(cond, "message")) { [15:31:56.723] muffled <- grepl(pattern, "muffleMessage") [15:31:56.723] if (muffled) [15:31:56.723] invokeRestart("muffleMessage") [15:31:56.723] } [15:31:56.723] else if (inherits(cond, "warning")) { [15:31:56.723] muffled <- grepl(pattern, "muffleWarning") [15:31:56.723] if (muffled) [15:31:56.723] invokeRestart("muffleWarning") [15:31:56.723] } [15:31:56.723] else if (inherits(cond, "condition")) { [15:31:56.723] if (!is.null(pattern)) { [15:31:56.723] computeRestarts <- base::computeRestarts [15:31:56.723] grepl <- base::grepl [15:31:56.723] restarts <- computeRestarts(cond) [15:31:56.723] for (restart in restarts) { [15:31:56.723] name <- restart$name [15:31:56.723] if (is.null(name)) [15:31:56.723] next [15:31:56.723] if (!grepl(pattern, name)) [15:31:56.723] next [15:31:56.723] invokeRestart(restart) [15:31:56.723] muffled <- TRUE [15:31:56.723] break [15:31:56.723] } [15:31:56.723] } [15:31:56.723] } [15:31:56.723] invisible(muffled) [15:31:56.723] } [15:31:56.723] muffleCondition(cond) [15:31:56.723] }) [15:31:56.723] })) [15:31:56.723] future::FutureResult(value = ...future.value$value, [15:31:56.723] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:56.723] ...future.rng), globalenv = if (FALSE) [15:31:56.723] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:56.723] ...future.globalenv.names)) [15:31:56.723] else NULL, started = ...future.startTime, version = "1.8") [15:31:56.723] }, condition = base::local({ [15:31:56.723] c <- base::c [15:31:56.723] inherits <- base::inherits [15:31:56.723] invokeRestart <- base::invokeRestart [15:31:56.723] length <- base::length [15:31:56.723] list <- base::list [15:31:56.723] seq.int <- base::seq.int [15:31:56.723] signalCondition <- base::signalCondition [15:31:56.723] sys.calls <- base::sys.calls [15:31:56.723] `[[` <- base::`[[` [15:31:56.723] `+` <- base::`+` [15:31:56.723] `<<-` <- base::`<<-` [15:31:56.723] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:56.723] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:56.723] 3L)] [15:31:56.723] } [15:31:56.723] function(cond) { [15:31:56.723] is_error <- inherits(cond, "error") [15:31:56.723] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:56.723] NULL) [15:31:56.723] if (is_error) { [15:31:56.723] sessionInformation <- function() { [15:31:56.723] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:56.723] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:56.723] search = base::search(), system = base::Sys.info()) [15:31:56.723] } [15:31:56.723] ...future.conditions[[length(...future.conditions) + [15:31:56.723] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:56.723] cond$call), session = sessionInformation(), [15:31:56.723] timestamp = base::Sys.time(), signaled = 0L) [15:31:56.723] signalCondition(cond) [15:31:56.723] } [15:31:56.723] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:56.723] "immediateCondition"))) { [15:31:56.723] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:56.723] ...future.conditions[[length(...future.conditions) + [15:31:56.723] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:56.723] if (TRUE && !signal) { [15:31:56.723] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.723] { [15:31:56.723] inherits <- base::inherits [15:31:56.723] invokeRestart <- base::invokeRestart [15:31:56.723] is.null <- base::is.null [15:31:56.723] muffled <- FALSE [15:31:56.723] if (inherits(cond, "message")) { [15:31:56.723] muffled <- grepl(pattern, "muffleMessage") [15:31:56.723] if (muffled) [15:31:56.723] invokeRestart("muffleMessage") [15:31:56.723] } [15:31:56.723] else if (inherits(cond, "warning")) { [15:31:56.723] muffled <- grepl(pattern, "muffleWarning") [15:31:56.723] if (muffled) [15:31:56.723] invokeRestart("muffleWarning") [15:31:56.723] } [15:31:56.723] else if (inherits(cond, "condition")) { [15:31:56.723] if (!is.null(pattern)) { [15:31:56.723] computeRestarts <- base::computeRestarts [15:31:56.723] grepl <- base::grepl [15:31:56.723] restarts <- computeRestarts(cond) [15:31:56.723] for (restart in restarts) { [15:31:56.723] name <- restart$name [15:31:56.723] if (is.null(name)) [15:31:56.723] next [15:31:56.723] if (!grepl(pattern, name)) [15:31:56.723] next [15:31:56.723] invokeRestart(restart) [15:31:56.723] muffled <- TRUE [15:31:56.723] break [15:31:56.723] } [15:31:56.723] } [15:31:56.723] } [15:31:56.723] invisible(muffled) [15:31:56.723] } [15:31:56.723] muffleCondition(cond, pattern = "^muffle") [15:31:56.723] } [15:31:56.723] } [15:31:56.723] else { [15:31:56.723] if (TRUE) { [15:31:56.723] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.723] { [15:31:56.723] inherits <- base::inherits [15:31:56.723] invokeRestart <- base::invokeRestart [15:31:56.723] is.null <- base::is.null [15:31:56.723] muffled <- FALSE [15:31:56.723] if (inherits(cond, "message")) { [15:31:56.723] muffled <- grepl(pattern, "muffleMessage") [15:31:56.723] if (muffled) [15:31:56.723] invokeRestart("muffleMessage") [15:31:56.723] } [15:31:56.723] else if (inherits(cond, "warning")) { [15:31:56.723] muffled <- grepl(pattern, "muffleWarning") [15:31:56.723] if (muffled) [15:31:56.723] invokeRestart("muffleWarning") [15:31:56.723] } [15:31:56.723] else if (inherits(cond, "condition")) { [15:31:56.723] if (!is.null(pattern)) { [15:31:56.723] computeRestarts <- base::computeRestarts [15:31:56.723] grepl <- base::grepl [15:31:56.723] restarts <- computeRestarts(cond) [15:31:56.723] for (restart in restarts) { [15:31:56.723] name <- restart$name [15:31:56.723] if (is.null(name)) [15:31:56.723] next [15:31:56.723] if (!grepl(pattern, name)) [15:31:56.723] next [15:31:56.723] invokeRestart(restart) [15:31:56.723] muffled <- TRUE [15:31:56.723] break [15:31:56.723] } [15:31:56.723] } [15:31:56.723] } [15:31:56.723] invisible(muffled) [15:31:56.723] } [15:31:56.723] muffleCondition(cond, pattern = "^muffle") [15:31:56.723] } [15:31:56.723] } [15:31:56.723] } [15:31:56.723] })) [15:31:56.723] }, error = function(ex) { [15:31:56.723] base::structure(base::list(value = NULL, visible = NULL, [15:31:56.723] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:56.723] ...future.rng), started = ...future.startTime, [15:31:56.723] finished = Sys.time(), session_uuid = NA_character_, [15:31:56.723] version = "1.8"), class = "FutureResult") [15:31:56.723] }, finally = { [15:31:56.723] if (!identical(...future.workdir, getwd())) [15:31:56.723] setwd(...future.workdir) [15:31:56.723] { [15:31:56.723] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:56.723] ...future.oldOptions$nwarnings <- NULL [15:31:56.723] } [15:31:56.723] base::options(...future.oldOptions) [15:31:56.723] if (.Platform$OS.type == "windows") { [15:31:56.723] old_names <- names(...future.oldEnvVars) [15:31:56.723] envs <- base::Sys.getenv() [15:31:56.723] names <- names(envs) [15:31:56.723] common <- intersect(names, old_names) [15:31:56.723] added <- setdiff(names, old_names) [15:31:56.723] removed <- setdiff(old_names, names) [15:31:56.723] changed <- common[...future.oldEnvVars[common] != [15:31:56.723] envs[common]] [15:31:56.723] NAMES <- toupper(changed) [15:31:56.723] args <- list() [15:31:56.723] for (kk in seq_along(NAMES)) { [15:31:56.723] name <- changed[[kk]] [15:31:56.723] NAME <- NAMES[[kk]] [15:31:56.723] if (name != NAME && is.element(NAME, old_names)) [15:31:56.723] next [15:31:56.723] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:56.723] } [15:31:56.723] NAMES <- toupper(added) [15:31:56.723] for (kk in seq_along(NAMES)) { [15:31:56.723] name <- added[[kk]] [15:31:56.723] NAME <- NAMES[[kk]] [15:31:56.723] if (name != NAME && is.element(NAME, old_names)) [15:31:56.723] next [15:31:56.723] args[[name]] <- "" [15:31:56.723] } [15:31:56.723] NAMES <- toupper(removed) [15:31:56.723] for (kk in seq_along(NAMES)) { [15:31:56.723] name <- removed[[kk]] [15:31:56.723] NAME <- NAMES[[kk]] [15:31:56.723] if (name != NAME && is.element(NAME, old_names)) [15:31:56.723] next [15:31:56.723] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:56.723] } [15:31:56.723] if (length(args) > 0) [15:31:56.723] base::do.call(base::Sys.setenv, args = args) [15:31:56.723] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:56.723] } [15:31:56.723] else { [15:31:56.723] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:56.723] } [15:31:56.723] { [15:31:56.723] if (base::length(...future.futureOptionsAdded) > [15:31:56.723] 0L) { [15:31:56.723] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:56.723] base::names(opts) <- ...future.futureOptionsAdded [15:31:56.723] base::options(opts) [15:31:56.723] } [15:31:56.723] { [15:31:56.723] { [15:31:56.723] base::options(mc.cores = ...future.mc.cores.old) [15:31:56.723] NULL [15:31:56.723] } [15:31:56.723] options(future.plan = NULL) [15:31:56.723] if (is.na(NA_character_)) [15:31:56.723] Sys.unsetenv("R_FUTURE_PLAN") [15:31:56.723] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:56.723] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:56.723] .init = FALSE) [15:31:56.723] } [15:31:56.723] } [15:31:56.723] } [15:31:56.723] }) [15:31:56.723] if (TRUE) { [15:31:56.723] base::sink(type = "output", split = FALSE) [15:31:56.723] if (TRUE) { [15:31:56.723] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:56.723] } [15:31:56.723] else { [15:31:56.723] ...future.result["stdout"] <- base::list(NULL) [15:31:56.723] } [15:31:56.723] base::close(...future.stdout) [15:31:56.723] ...future.stdout <- NULL [15:31:56.723] } [15:31:56.723] ...future.result$conditions <- ...future.conditions [15:31:56.723] ...future.result$finished <- base::Sys.time() [15:31:56.723] ...future.result [15:31:56.723] } [15:31:56.733] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:56.733] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:56.734] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:56.735] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:56.735] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:56.736] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [15:31:56.736] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [15:31:56.737] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:56.737] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:56.738] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:56.741] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:56.741] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:56.743] MultisessionFuture started [15:31:56.743] - Launch lazy future ... done [15:31:56.743] run() for 'MultisessionFuture' ... done [15:31:56.744] Created future: [15:31:56.768] receiveMessageFromWorker() for ClusterFuture ... [15:31:56.769] - Validating connection of MultisessionFuture [15:31:56.769] - received message: FutureResult [15:31:56.770] - Received FutureResult [15:31:56.770] - Erased future from FutureRegistry [15:31:56.770] result() for ClusterFuture ... [15:31:56.771] - result already collected: FutureResult [15:31:56.771] result() for ClusterFuture ... done [15:31:56.771] receiveMessageFromWorker() for ClusterFuture ... done [15:31:56.744] MultisessionFuture: [15:31:56.744] Label: 'future_lapply-2' [15:31:56.744] Expression: [15:31:56.744] { [15:31:56.744] do.call(function(...) { [15:31:56.744] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.744] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:56.744] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.744] on.exit(options(oopts), add = TRUE) [15:31:56.744] } [15:31:56.744] { [15:31:56.744] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:56.744] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.744] ...future.FUN(...future.X_jj, ...) [15:31:56.744] }) [15:31:56.744] } [15:31:56.744] }, args = future.call.arguments) [15:31:56.744] } [15:31:56.744] Lazy evaluation: FALSE [15:31:56.744] Asynchronous evaluation: TRUE [15:31:56.744] Local evaluation: TRUE [15:31:56.744] Environment: R_GlobalEnv [15:31:56.744] Capture standard output: TRUE [15:31:56.744] Capture condition classes: 'condition' (excluding 'nothing') [15:31:56.744] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:56.744] Packages: [15:31:56.744] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:56.744] Resolved: TRUE [15:31:56.744] Value: [15:31:56.744] Conditions captured: [15:31:56.744] Early signaling: FALSE [15:31:56.744] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:56.744] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:56.772] Chunk #2 of 4 ... DONE [15:31:56.772] Chunk #3 of 4 ... [15:31:56.773] - Finding globals in 'X' for chunk #3 ... [15:31:56.773] getGlobalsAndPackages() ... [15:31:56.773] Searching for globals... [15:31:56.774] [15:31:56.774] Searching for globals ... DONE [15:31:56.774] - globals: [0] [15:31:56.775] getGlobalsAndPackages() ... DONE [15:31:56.775] + additional globals found: [n=0] [15:31:56.775] + additional namespaces needed: [n=0] [15:31:56.775] - Finding globals in 'X' for chunk #3 ... DONE [15:31:56.776] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:56.776] - seeds: [15:31:56.776] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.777] getGlobalsAndPackages() ... [15:31:56.777] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.777] Resolving globals: FALSE [15:31:56.777] Tweak future expression to call with '...' arguments ... [15:31:56.778] { [15:31:56.778] do.call(function(...) { [15:31:56.778] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.778] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:56.778] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.778] on.exit(options(oopts), add = TRUE) [15:31:56.778] } [15:31:56.778] { [15:31:56.778] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:56.778] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.778] ...future.FUN(...future.X_jj, ...) [15:31:56.778] }) [15:31:56.778] } [15:31:56.778] }, args = future.call.arguments) [15:31:56.778] } [15:31:56.779] Tweak future expression to call with '...' arguments ... DONE [15:31:56.779] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.780] [15:31:56.780] getGlobalsAndPackages() ... DONE [15:31:56.781] run() for 'Future' ... [15:31:56.781] - state: 'created' [15:31:56.781] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:56.796] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:56.797] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:56.797] - Field: 'node' [15:31:56.797] - Field: 'label' [15:31:56.797] - Field: 'local' [15:31:56.798] - Field: 'owner' [15:31:56.798] - Field: 'envir' [15:31:56.798] - Field: 'workers' [15:31:56.798] - Field: 'packages' [15:31:56.798] - Field: 'gc' [15:31:56.799] - Field: 'conditions' [15:31:56.799] - Field: 'persistent' [15:31:56.799] - Field: 'expr' [15:31:56.799] - Field: 'uuid' [15:31:56.800] - Field: 'seed' [15:31:56.800] - Field: 'version' [15:31:56.800] - Field: 'result' [15:31:56.801] - Field: 'asynchronous' [15:31:56.801] - Field: 'calls' [15:31:56.801] - Field: 'globals' [15:31:56.801] - Field: 'stdout' [15:31:56.802] - Field: 'earlySignal' [15:31:56.802] - Field: 'lazy' [15:31:56.802] - Field: 'state' [15:31:56.802] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:56.802] - Launch lazy future ... [15:31:56.803] Packages needed by the future expression (n = 0): [15:31:56.803] Packages needed by future strategies (n = 0): [15:31:56.804] { [15:31:56.804] { [15:31:56.804] { [15:31:56.804] ...future.startTime <- base::Sys.time() [15:31:56.804] { [15:31:56.804] { [15:31:56.804] { [15:31:56.804] { [15:31:56.804] base::local({ [15:31:56.804] has_future <- base::requireNamespace("future", [15:31:56.804] quietly = TRUE) [15:31:56.804] if (has_future) { [15:31:56.804] ns <- base::getNamespace("future") [15:31:56.804] version <- ns[[".package"]][["version"]] [15:31:56.804] if (is.null(version)) [15:31:56.804] version <- utils::packageVersion("future") [15:31:56.804] } [15:31:56.804] else { [15:31:56.804] version <- NULL [15:31:56.804] } [15:31:56.804] if (!has_future || version < "1.8.0") { [15:31:56.804] info <- base::c(r_version = base::gsub("R version ", [15:31:56.804] "", base::R.version$version.string), [15:31:56.804] platform = base::sprintf("%s (%s-bit)", [15:31:56.804] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:56.804] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:56.804] "release", "version")], collapse = " "), [15:31:56.804] hostname = base::Sys.info()[["nodename"]]) [15:31:56.804] info <- base::sprintf("%s: %s", base::names(info), [15:31:56.804] info) [15:31:56.804] info <- base::paste(info, collapse = "; ") [15:31:56.804] if (!has_future) { [15:31:56.804] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:56.804] info) [15:31:56.804] } [15:31:56.804] else { [15:31:56.804] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:56.804] info, version) [15:31:56.804] } [15:31:56.804] base::stop(msg) [15:31:56.804] } [15:31:56.804] }) [15:31:56.804] } [15:31:56.804] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:56.804] base::options(mc.cores = 1L) [15:31:56.804] } [15:31:56.804] ...future.strategy.old <- future::plan("list") [15:31:56.804] options(future.plan = NULL) [15:31:56.804] Sys.unsetenv("R_FUTURE_PLAN") [15:31:56.804] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:56.804] } [15:31:56.804] ...future.workdir <- getwd() [15:31:56.804] } [15:31:56.804] ...future.oldOptions <- base::as.list(base::.Options) [15:31:56.804] ...future.oldEnvVars <- base::Sys.getenv() [15:31:56.804] } [15:31:56.804] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:56.804] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:56.804] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:56.804] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:56.804] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:56.804] future.stdout.windows.reencode = NULL, width = 80L) [15:31:56.804] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:56.804] base::names(...future.oldOptions)) [15:31:56.804] } [15:31:56.804] if (FALSE) { [15:31:56.804] } [15:31:56.804] else { [15:31:56.804] if (TRUE) { [15:31:56.804] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:56.804] open = "w") [15:31:56.804] } [15:31:56.804] else { [15:31:56.804] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:56.804] windows = "NUL", "/dev/null"), open = "w") [15:31:56.804] } [15:31:56.804] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:56.804] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:56.804] base::sink(type = "output", split = FALSE) [15:31:56.804] base::close(...future.stdout) [15:31:56.804] }, add = TRUE) [15:31:56.804] } [15:31:56.804] ...future.frame <- base::sys.nframe() [15:31:56.804] ...future.conditions <- base::list() [15:31:56.804] ...future.rng <- base::globalenv()$.Random.seed [15:31:56.804] if (FALSE) { [15:31:56.804] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:56.804] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:56.804] } [15:31:56.804] ...future.result <- base::tryCatch({ [15:31:56.804] base::withCallingHandlers({ [15:31:56.804] ...future.value <- base::withVisible(base::local({ [15:31:56.804] ...future.makeSendCondition <- base::local({ [15:31:56.804] sendCondition <- NULL [15:31:56.804] function(frame = 1L) { [15:31:56.804] if (is.function(sendCondition)) [15:31:56.804] return(sendCondition) [15:31:56.804] ns <- getNamespace("parallel") [15:31:56.804] if (exists("sendData", mode = "function", [15:31:56.804] envir = ns)) { [15:31:56.804] parallel_sendData <- get("sendData", mode = "function", [15:31:56.804] envir = ns) [15:31:56.804] envir <- sys.frame(frame) [15:31:56.804] master <- NULL [15:31:56.804] while (!identical(envir, .GlobalEnv) && [15:31:56.804] !identical(envir, emptyenv())) { [15:31:56.804] if (exists("master", mode = "list", envir = envir, [15:31:56.804] inherits = FALSE)) { [15:31:56.804] master <- get("master", mode = "list", [15:31:56.804] envir = envir, inherits = FALSE) [15:31:56.804] if (inherits(master, c("SOCKnode", [15:31:56.804] "SOCK0node"))) { [15:31:56.804] sendCondition <<- function(cond) { [15:31:56.804] data <- list(type = "VALUE", value = cond, [15:31:56.804] success = TRUE) [15:31:56.804] parallel_sendData(master, data) [15:31:56.804] } [15:31:56.804] return(sendCondition) [15:31:56.804] } [15:31:56.804] } [15:31:56.804] frame <- frame + 1L [15:31:56.804] envir <- sys.frame(frame) [15:31:56.804] } [15:31:56.804] } [15:31:56.804] sendCondition <<- function(cond) NULL [15:31:56.804] } [15:31:56.804] }) [15:31:56.804] withCallingHandlers({ [15:31:56.804] { [15:31:56.804] do.call(function(...) { [15:31:56.804] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.804] if (!identical(...future.globals.maxSize.org, [15:31:56.804] ...future.globals.maxSize)) { [15:31:56.804] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.804] on.exit(options(oopts), add = TRUE) [15:31:56.804] } [15:31:56.804] { [15:31:56.804] lapply(seq_along(...future.elements_ii), [15:31:56.804] FUN = function(jj) { [15:31:56.804] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.804] ...future.FUN(...future.X_jj, ...) [15:31:56.804] }) [15:31:56.804] } [15:31:56.804] }, args = future.call.arguments) [15:31:56.804] } [15:31:56.804] }, immediateCondition = function(cond) { [15:31:56.804] sendCondition <- ...future.makeSendCondition() [15:31:56.804] sendCondition(cond) [15:31:56.804] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.804] { [15:31:56.804] inherits <- base::inherits [15:31:56.804] invokeRestart <- base::invokeRestart [15:31:56.804] is.null <- base::is.null [15:31:56.804] muffled <- FALSE [15:31:56.804] if (inherits(cond, "message")) { [15:31:56.804] muffled <- grepl(pattern, "muffleMessage") [15:31:56.804] if (muffled) [15:31:56.804] invokeRestart("muffleMessage") [15:31:56.804] } [15:31:56.804] else if (inherits(cond, "warning")) { [15:31:56.804] muffled <- grepl(pattern, "muffleWarning") [15:31:56.804] if (muffled) [15:31:56.804] invokeRestart("muffleWarning") [15:31:56.804] } [15:31:56.804] else if (inherits(cond, "condition")) { [15:31:56.804] if (!is.null(pattern)) { [15:31:56.804] computeRestarts <- base::computeRestarts [15:31:56.804] grepl <- base::grepl [15:31:56.804] restarts <- computeRestarts(cond) [15:31:56.804] for (restart in restarts) { [15:31:56.804] name <- restart$name [15:31:56.804] if (is.null(name)) [15:31:56.804] next [15:31:56.804] if (!grepl(pattern, name)) [15:31:56.804] next [15:31:56.804] invokeRestart(restart) [15:31:56.804] muffled <- TRUE [15:31:56.804] break [15:31:56.804] } [15:31:56.804] } [15:31:56.804] } [15:31:56.804] invisible(muffled) [15:31:56.804] } [15:31:56.804] muffleCondition(cond) [15:31:56.804] }) [15:31:56.804] })) [15:31:56.804] future::FutureResult(value = ...future.value$value, [15:31:56.804] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:56.804] ...future.rng), globalenv = if (FALSE) [15:31:56.804] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:56.804] ...future.globalenv.names)) [15:31:56.804] else NULL, started = ...future.startTime, version = "1.8") [15:31:56.804] }, condition = base::local({ [15:31:56.804] c <- base::c [15:31:56.804] inherits <- base::inherits [15:31:56.804] invokeRestart <- base::invokeRestart [15:31:56.804] length <- base::length [15:31:56.804] list <- base::list [15:31:56.804] seq.int <- base::seq.int [15:31:56.804] signalCondition <- base::signalCondition [15:31:56.804] sys.calls <- base::sys.calls [15:31:56.804] `[[` <- base::`[[` [15:31:56.804] `+` <- base::`+` [15:31:56.804] `<<-` <- base::`<<-` [15:31:56.804] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:56.804] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:56.804] 3L)] [15:31:56.804] } [15:31:56.804] function(cond) { [15:31:56.804] is_error <- inherits(cond, "error") [15:31:56.804] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:56.804] NULL) [15:31:56.804] if (is_error) { [15:31:56.804] sessionInformation <- function() { [15:31:56.804] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:56.804] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:56.804] search = base::search(), system = base::Sys.info()) [15:31:56.804] } [15:31:56.804] ...future.conditions[[length(...future.conditions) + [15:31:56.804] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:56.804] cond$call), session = sessionInformation(), [15:31:56.804] timestamp = base::Sys.time(), signaled = 0L) [15:31:56.804] signalCondition(cond) [15:31:56.804] } [15:31:56.804] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:56.804] "immediateCondition"))) { [15:31:56.804] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:56.804] ...future.conditions[[length(...future.conditions) + [15:31:56.804] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:56.804] if (TRUE && !signal) { [15:31:56.804] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.804] { [15:31:56.804] inherits <- base::inherits [15:31:56.804] invokeRestart <- base::invokeRestart [15:31:56.804] is.null <- base::is.null [15:31:56.804] muffled <- FALSE [15:31:56.804] if (inherits(cond, "message")) { [15:31:56.804] muffled <- grepl(pattern, "muffleMessage") [15:31:56.804] if (muffled) [15:31:56.804] invokeRestart("muffleMessage") [15:31:56.804] } [15:31:56.804] else if (inherits(cond, "warning")) { [15:31:56.804] muffled <- grepl(pattern, "muffleWarning") [15:31:56.804] if (muffled) [15:31:56.804] invokeRestart("muffleWarning") [15:31:56.804] } [15:31:56.804] else if (inherits(cond, "condition")) { [15:31:56.804] if (!is.null(pattern)) { [15:31:56.804] computeRestarts <- base::computeRestarts [15:31:56.804] grepl <- base::grepl [15:31:56.804] restarts <- computeRestarts(cond) [15:31:56.804] for (restart in restarts) { [15:31:56.804] name <- restart$name [15:31:56.804] if (is.null(name)) [15:31:56.804] next [15:31:56.804] if (!grepl(pattern, name)) [15:31:56.804] next [15:31:56.804] invokeRestart(restart) [15:31:56.804] muffled <- TRUE [15:31:56.804] break [15:31:56.804] } [15:31:56.804] } [15:31:56.804] } [15:31:56.804] invisible(muffled) [15:31:56.804] } [15:31:56.804] muffleCondition(cond, pattern = "^muffle") [15:31:56.804] } [15:31:56.804] } [15:31:56.804] else { [15:31:56.804] if (TRUE) { [15:31:56.804] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.804] { [15:31:56.804] inherits <- base::inherits [15:31:56.804] invokeRestart <- base::invokeRestart [15:31:56.804] is.null <- base::is.null [15:31:56.804] muffled <- FALSE [15:31:56.804] if (inherits(cond, "message")) { [15:31:56.804] muffled <- grepl(pattern, "muffleMessage") [15:31:56.804] if (muffled) [15:31:56.804] invokeRestart("muffleMessage") [15:31:56.804] } [15:31:56.804] else if (inherits(cond, "warning")) { [15:31:56.804] muffled <- grepl(pattern, "muffleWarning") [15:31:56.804] if (muffled) [15:31:56.804] invokeRestart("muffleWarning") [15:31:56.804] } [15:31:56.804] else if (inherits(cond, "condition")) { [15:31:56.804] if (!is.null(pattern)) { [15:31:56.804] computeRestarts <- base::computeRestarts [15:31:56.804] grepl <- base::grepl [15:31:56.804] restarts <- computeRestarts(cond) [15:31:56.804] for (restart in restarts) { [15:31:56.804] name <- restart$name [15:31:56.804] if (is.null(name)) [15:31:56.804] next [15:31:56.804] if (!grepl(pattern, name)) [15:31:56.804] next [15:31:56.804] invokeRestart(restart) [15:31:56.804] muffled <- TRUE [15:31:56.804] break [15:31:56.804] } [15:31:56.804] } [15:31:56.804] } [15:31:56.804] invisible(muffled) [15:31:56.804] } [15:31:56.804] muffleCondition(cond, pattern = "^muffle") [15:31:56.804] } [15:31:56.804] } [15:31:56.804] } [15:31:56.804] })) [15:31:56.804] }, error = function(ex) { [15:31:56.804] base::structure(base::list(value = NULL, visible = NULL, [15:31:56.804] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:56.804] ...future.rng), started = ...future.startTime, [15:31:56.804] finished = Sys.time(), session_uuid = NA_character_, [15:31:56.804] version = "1.8"), class = "FutureResult") [15:31:56.804] }, finally = { [15:31:56.804] if (!identical(...future.workdir, getwd())) [15:31:56.804] setwd(...future.workdir) [15:31:56.804] { [15:31:56.804] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:56.804] ...future.oldOptions$nwarnings <- NULL [15:31:56.804] } [15:31:56.804] base::options(...future.oldOptions) [15:31:56.804] if (.Platform$OS.type == "windows") { [15:31:56.804] old_names <- names(...future.oldEnvVars) [15:31:56.804] envs <- base::Sys.getenv() [15:31:56.804] names <- names(envs) [15:31:56.804] common <- intersect(names, old_names) [15:31:56.804] added <- setdiff(names, old_names) [15:31:56.804] removed <- setdiff(old_names, names) [15:31:56.804] changed <- common[...future.oldEnvVars[common] != [15:31:56.804] envs[common]] [15:31:56.804] NAMES <- toupper(changed) [15:31:56.804] args <- list() [15:31:56.804] for (kk in seq_along(NAMES)) { [15:31:56.804] name <- changed[[kk]] [15:31:56.804] NAME <- NAMES[[kk]] [15:31:56.804] if (name != NAME && is.element(NAME, old_names)) [15:31:56.804] next [15:31:56.804] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:56.804] } [15:31:56.804] NAMES <- toupper(added) [15:31:56.804] for (kk in seq_along(NAMES)) { [15:31:56.804] name <- added[[kk]] [15:31:56.804] NAME <- NAMES[[kk]] [15:31:56.804] if (name != NAME && is.element(NAME, old_names)) [15:31:56.804] next [15:31:56.804] args[[name]] <- "" [15:31:56.804] } [15:31:56.804] NAMES <- toupper(removed) [15:31:56.804] for (kk in seq_along(NAMES)) { [15:31:56.804] name <- removed[[kk]] [15:31:56.804] NAME <- NAMES[[kk]] [15:31:56.804] if (name != NAME && is.element(NAME, old_names)) [15:31:56.804] next [15:31:56.804] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:56.804] } [15:31:56.804] if (length(args) > 0) [15:31:56.804] base::do.call(base::Sys.setenv, args = args) [15:31:56.804] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:56.804] } [15:31:56.804] else { [15:31:56.804] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:56.804] } [15:31:56.804] { [15:31:56.804] if (base::length(...future.futureOptionsAdded) > [15:31:56.804] 0L) { [15:31:56.804] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:56.804] base::names(opts) <- ...future.futureOptionsAdded [15:31:56.804] base::options(opts) [15:31:56.804] } [15:31:56.804] { [15:31:56.804] { [15:31:56.804] base::options(mc.cores = ...future.mc.cores.old) [15:31:56.804] NULL [15:31:56.804] } [15:31:56.804] options(future.plan = NULL) [15:31:56.804] if (is.na(NA_character_)) [15:31:56.804] Sys.unsetenv("R_FUTURE_PLAN") [15:31:56.804] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:56.804] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:56.804] .init = FALSE) [15:31:56.804] } [15:31:56.804] } [15:31:56.804] } [15:31:56.804] }) [15:31:56.804] if (TRUE) { [15:31:56.804] base::sink(type = "output", split = FALSE) [15:31:56.804] if (TRUE) { [15:31:56.804] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:56.804] } [15:31:56.804] else { [15:31:56.804] ...future.result["stdout"] <- base::list(NULL) [15:31:56.804] } [15:31:56.804] base::close(...future.stdout) [15:31:56.804] ...future.stdout <- NULL [15:31:56.804] } [15:31:56.804] ...future.result$conditions <- ...future.conditions [15:31:56.804] ...future.result$finished <- base::Sys.time() [15:31:56.804] ...future.result [15:31:56.804] } [15:31:56.810] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:56.810] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:56.811] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:56.811] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:56.812] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:56.812] Exporting '...future.elements_ii' (120 bytes) to cluster node #1 ... [15:31:56.812] Exporting '...future.elements_ii' (120 bytes) to cluster node #1 ... DONE [15:31:56.813] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:56.813] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:56.813] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:56.814] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:56.814] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:56.814] MultisessionFuture started [15:31:56.815] - Launch lazy future ... done [15:31:56.815] run() for 'MultisessionFuture' ... done [15:31:56.815] Created future: [15:31:56.832] receiveMessageFromWorker() for ClusterFuture ... [15:31:56.832] - Validating connection of MultisessionFuture [15:31:56.833] - received message: FutureResult [15:31:56.833] - Received FutureResult [15:31:56.833] - Erased future from FutureRegistry [15:31:56.834] result() for ClusterFuture ... [15:31:56.834] - result already collected: FutureResult [15:31:56.834] result() for ClusterFuture ... done [15:31:56.835] receiveMessageFromWorker() for ClusterFuture ... done [15:31:56.815] MultisessionFuture: [15:31:56.815] Label: 'future_lapply-3' [15:31:56.815] Expression: [15:31:56.815] { [15:31:56.815] do.call(function(...) { [15:31:56.815] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.815] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:56.815] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.815] on.exit(options(oopts), add = TRUE) [15:31:56.815] } [15:31:56.815] { [15:31:56.815] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:56.815] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.815] ...future.FUN(...future.X_jj, ...) [15:31:56.815] }) [15:31:56.815] } [15:31:56.815] }, args = future.call.arguments) [15:31:56.815] } [15:31:56.815] Lazy evaluation: FALSE [15:31:56.815] Asynchronous evaluation: TRUE [15:31:56.815] Local evaluation: TRUE [15:31:56.815] Environment: R_GlobalEnv [15:31:56.815] Capture standard output: TRUE [15:31:56.815] Capture condition classes: 'condition' (excluding 'nothing') [15:31:56.815] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 120 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:56.815] Packages: [15:31:56.815] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:56.815] Resolved: TRUE [15:31:56.815] Value: [15:31:56.815] Conditions captured: [15:31:56.815] Early signaling: FALSE [15:31:56.815] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:56.815] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:56.835] Chunk #3 of 4 ... DONE [15:31:56.836] Chunk #4 of 4 ... [15:31:56.836] - Finding globals in 'X' for chunk #4 ... [15:31:56.836] getGlobalsAndPackages() ... [15:31:56.837] Searching for globals... [15:31:56.837] [15:31:56.837] Searching for globals ... DONE [15:31:56.838] - globals: [0] [15:31:56.838] getGlobalsAndPackages() ... DONE [15:31:56.838] + additional globals found: [n=0] [15:31:56.839] + additional namespaces needed: [n=0] [15:31:56.839] - Finding globals in 'X' for chunk #4 ... DONE [15:31:56.839] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [15:31:56.839] - seeds: [15:31:56.840] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.840] getGlobalsAndPackages() ... [15:31:56.840] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.841] Resolving globals: FALSE [15:31:56.841] Tweak future expression to call with '...' arguments ... [15:31:56.841] { [15:31:56.841] do.call(function(...) { [15:31:56.841] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.841] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:56.841] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.841] on.exit(options(oopts), add = TRUE) [15:31:56.841] } [15:31:56.841] { [15:31:56.841] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:56.841] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.841] ...future.FUN(...future.X_jj, ...) [15:31:56.841] }) [15:31:56.841] } [15:31:56.841] }, args = future.call.arguments) [15:31:56.841] } [15:31:56.842] Tweak future expression to call with '...' arguments ... DONE [15:31:56.843] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:56.843] [15:31:56.843] getGlobalsAndPackages() ... DONE [15:31:56.844] run() for 'Future' ... [15:31:56.844] - state: 'created' [15:31:56.845] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:56.863] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:56.863] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:56.864] - Field: 'node' [15:31:56.864] - Field: 'label' [15:31:56.864] - Field: 'local' [15:31:56.865] - Field: 'owner' [15:31:56.865] - Field: 'envir' [15:31:56.865] - Field: 'workers' [15:31:56.866] - Field: 'packages' [15:31:56.866] - Field: 'gc' [15:31:56.866] - Field: 'conditions' [15:31:56.867] - Field: 'persistent' [15:31:56.867] - Field: 'expr' [15:31:56.867] - Field: 'uuid' [15:31:56.867] - Field: 'seed' [15:31:56.868] - Field: 'version' [15:31:56.868] - Field: 'result' [15:31:56.868] - Field: 'asynchronous' [15:31:56.869] - Field: 'calls' [15:31:56.869] - Field: 'globals' [15:31:56.869] - Field: 'stdout' [15:31:56.869] - Field: 'earlySignal' [15:31:56.870] - Field: 'lazy' [15:31:56.870] - Field: 'state' [15:31:56.870] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:56.871] - Launch lazy future ... [15:31:56.871] Packages needed by the future expression (n = 0): [15:31:56.872] Packages needed by future strategies (n = 0): [15:31:56.873] { [15:31:56.873] { [15:31:56.873] { [15:31:56.873] ...future.startTime <- base::Sys.time() [15:31:56.873] { [15:31:56.873] { [15:31:56.873] { [15:31:56.873] { [15:31:56.873] base::local({ [15:31:56.873] has_future <- base::requireNamespace("future", [15:31:56.873] quietly = TRUE) [15:31:56.873] if (has_future) { [15:31:56.873] ns <- base::getNamespace("future") [15:31:56.873] version <- ns[[".package"]][["version"]] [15:31:56.873] if (is.null(version)) [15:31:56.873] version <- utils::packageVersion("future") [15:31:56.873] } [15:31:56.873] else { [15:31:56.873] version <- NULL [15:31:56.873] } [15:31:56.873] if (!has_future || version < "1.8.0") { [15:31:56.873] info <- base::c(r_version = base::gsub("R version ", [15:31:56.873] "", base::R.version$version.string), [15:31:56.873] platform = base::sprintf("%s (%s-bit)", [15:31:56.873] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:56.873] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:56.873] "release", "version")], collapse = " "), [15:31:56.873] hostname = base::Sys.info()[["nodename"]]) [15:31:56.873] info <- base::sprintf("%s: %s", base::names(info), [15:31:56.873] info) [15:31:56.873] info <- base::paste(info, collapse = "; ") [15:31:56.873] if (!has_future) { [15:31:56.873] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:56.873] info) [15:31:56.873] } [15:31:56.873] else { [15:31:56.873] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:56.873] info, version) [15:31:56.873] } [15:31:56.873] base::stop(msg) [15:31:56.873] } [15:31:56.873] }) [15:31:56.873] } [15:31:56.873] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:56.873] base::options(mc.cores = 1L) [15:31:56.873] } [15:31:56.873] ...future.strategy.old <- future::plan("list") [15:31:56.873] options(future.plan = NULL) [15:31:56.873] Sys.unsetenv("R_FUTURE_PLAN") [15:31:56.873] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:56.873] } [15:31:56.873] ...future.workdir <- getwd() [15:31:56.873] } [15:31:56.873] ...future.oldOptions <- base::as.list(base::.Options) [15:31:56.873] ...future.oldEnvVars <- base::Sys.getenv() [15:31:56.873] } [15:31:56.873] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:56.873] future.globals.maxSize = 2097152000, future.globals.method = NULL, [15:31:56.873] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:56.873] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:56.873] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:56.873] future.stdout.windows.reencode = NULL, width = 80L) [15:31:56.873] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:56.873] base::names(...future.oldOptions)) [15:31:56.873] } [15:31:56.873] if (FALSE) { [15:31:56.873] } [15:31:56.873] else { [15:31:56.873] if (TRUE) { [15:31:56.873] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:56.873] open = "w") [15:31:56.873] } [15:31:56.873] else { [15:31:56.873] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:56.873] windows = "NUL", "/dev/null"), open = "w") [15:31:56.873] } [15:31:56.873] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:56.873] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:56.873] base::sink(type = "output", split = FALSE) [15:31:56.873] base::close(...future.stdout) [15:31:56.873] }, add = TRUE) [15:31:56.873] } [15:31:56.873] ...future.frame <- base::sys.nframe() [15:31:56.873] ...future.conditions <- base::list() [15:31:56.873] ...future.rng <- base::globalenv()$.Random.seed [15:31:56.873] if (FALSE) { [15:31:56.873] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:56.873] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:56.873] } [15:31:56.873] ...future.result <- base::tryCatch({ [15:31:56.873] base::withCallingHandlers({ [15:31:56.873] ...future.value <- base::withVisible(base::local({ [15:31:56.873] ...future.makeSendCondition <- base::local({ [15:31:56.873] sendCondition <- NULL [15:31:56.873] function(frame = 1L) { [15:31:56.873] if (is.function(sendCondition)) [15:31:56.873] return(sendCondition) [15:31:56.873] ns <- getNamespace("parallel") [15:31:56.873] if (exists("sendData", mode = "function", [15:31:56.873] envir = ns)) { [15:31:56.873] parallel_sendData <- get("sendData", mode = "function", [15:31:56.873] envir = ns) [15:31:56.873] envir <- sys.frame(frame) [15:31:56.873] master <- NULL [15:31:56.873] while (!identical(envir, .GlobalEnv) && [15:31:56.873] !identical(envir, emptyenv())) { [15:31:56.873] if (exists("master", mode = "list", envir = envir, [15:31:56.873] inherits = FALSE)) { [15:31:56.873] master <- get("master", mode = "list", [15:31:56.873] envir = envir, inherits = FALSE) [15:31:56.873] if (inherits(master, c("SOCKnode", [15:31:56.873] "SOCK0node"))) { [15:31:56.873] sendCondition <<- function(cond) { [15:31:56.873] data <- list(type = "VALUE", value = cond, [15:31:56.873] success = TRUE) [15:31:56.873] parallel_sendData(master, data) [15:31:56.873] } [15:31:56.873] return(sendCondition) [15:31:56.873] } [15:31:56.873] } [15:31:56.873] frame <- frame + 1L [15:31:56.873] envir <- sys.frame(frame) [15:31:56.873] } [15:31:56.873] } [15:31:56.873] sendCondition <<- function(cond) NULL [15:31:56.873] } [15:31:56.873] }) [15:31:56.873] withCallingHandlers({ [15:31:56.873] { [15:31:56.873] do.call(function(...) { [15:31:56.873] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.873] if (!identical(...future.globals.maxSize.org, [15:31:56.873] ...future.globals.maxSize)) { [15:31:56.873] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.873] on.exit(options(oopts), add = TRUE) [15:31:56.873] } [15:31:56.873] { [15:31:56.873] lapply(seq_along(...future.elements_ii), [15:31:56.873] FUN = function(jj) { [15:31:56.873] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.873] ...future.FUN(...future.X_jj, ...) [15:31:56.873] }) [15:31:56.873] } [15:31:56.873] }, args = future.call.arguments) [15:31:56.873] } [15:31:56.873] }, immediateCondition = function(cond) { [15:31:56.873] sendCondition <- ...future.makeSendCondition() [15:31:56.873] sendCondition(cond) [15:31:56.873] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.873] { [15:31:56.873] inherits <- base::inherits [15:31:56.873] invokeRestart <- base::invokeRestart [15:31:56.873] is.null <- base::is.null [15:31:56.873] muffled <- FALSE [15:31:56.873] if (inherits(cond, "message")) { [15:31:56.873] muffled <- grepl(pattern, "muffleMessage") [15:31:56.873] if (muffled) [15:31:56.873] invokeRestart("muffleMessage") [15:31:56.873] } [15:31:56.873] else if (inherits(cond, "warning")) { [15:31:56.873] muffled <- grepl(pattern, "muffleWarning") [15:31:56.873] if (muffled) [15:31:56.873] invokeRestart("muffleWarning") [15:31:56.873] } [15:31:56.873] else if (inherits(cond, "condition")) { [15:31:56.873] if (!is.null(pattern)) { [15:31:56.873] computeRestarts <- base::computeRestarts [15:31:56.873] grepl <- base::grepl [15:31:56.873] restarts <- computeRestarts(cond) [15:31:56.873] for (restart in restarts) { [15:31:56.873] name <- restart$name [15:31:56.873] if (is.null(name)) [15:31:56.873] next [15:31:56.873] if (!grepl(pattern, name)) [15:31:56.873] next [15:31:56.873] invokeRestart(restart) [15:31:56.873] muffled <- TRUE [15:31:56.873] break [15:31:56.873] } [15:31:56.873] } [15:31:56.873] } [15:31:56.873] invisible(muffled) [15:31:56.873] } [15:31:56.873] muffleCondition(cond) [15:31:56.873] }) [15:31:56.873] })) [15:31:56.873] future::FutureResult(value = ...future.value$value, [15:31:56.873] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:56.873] ...future.rng), globalenv = if (FALSE) [15:31:56.873] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:56.873] ...future.globalenv.names)) [15:31:56.873] else NULL, started = ...future.startTime, version = "1.8") [15:31:56.873] }, condition = base::local({ [15:31:56.873] c <- base::c [15:31:56.873] inherits <- base::inherits [15:31:56.873] invokeRestart <- base::invokeRestart [15:31:56.873] length <- base::length [15:31:56.873] list <- base::list [15:31:56.873] seq.int <- base::seq.int [15:31:56.873] signalCondition <- base::signalCondition [15:31:56.873] sys.calls <- base::sys.calls [15:31:56.873] `[[` <- base::`[[` [15:31:56.873] `+` <- base::`+` [15:31:56.873] `<<-` <- base::`<<-` [15:31:56.873] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:56.873] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:56.873] 3L)] [15:31:56.873] } [15:31:56.873] function(cond) { [15:31:56.873] is_error <- inherits(cond, "error") [15:31:56.873] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:56.873] NULL) [15:31:56.873] if (is_error) { [15:31:56.873] sessionInformation <- function() { [15:31:56.873] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:56.873] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:56.873] search = base::search(), system = base::Sys.info()) [15:31:56.873] } [15:31:56.873] ...future.conditions[[length(...future.conditions) + [15:31:56.873] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:56.873] cond$call), session = sessionInformation(), [15:31:56.873] timestamp = base::Sys.time(), signaled = 0L) [15:31:56.873] signalCondition(cond) [15:31:56.873] } [15:31:56.873] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:56.873] "immediateCondition"))) { [15:31:56.873] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:56.873] ...future.conditions[[length(...future.conditions) + [15:31:56.873] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:56.873] if (TRUE && !signal) { [15:31:56.873] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.873] { [15:31:56.873] inherits <- base::inherits [15:31:56.873] invokeRestart <- base::invokeRestart [15:31:56.873] is.null <- base::is.null [15:31:56.873] muffled <- FALSE [15:31:56.873] if (inherits(cond, "message")) { [15:31:56.873] muffled <- grepl(pattern, "muffleMessage") [15:31:56.873] if (muffled) [15:31:56.873] invokeRestart("muffleMessage") [15:31:56.873] } [15:31:56.873] else if (inherits(cond, "warning")) { [15:31:56.873] muffled <- grepl(pattern, "muffleWarning") [15:31:56.873] if (muffled) [15:31:56.873] invokeRestart("muffleWarning") [15:31:56.873] } [15:31:56.873] else if (inherits(cond, "condition")) { [15:31:56.873] if (!is.null(pattern)) { [15:31:56.873] computeRestarts <- base::computeRestarts [15:31:56.873] grepl <- base::grepl [15:31:56.873] restarts <- computeRestarts(cond) [15:31:56.873] for (restart in restarts) { [15:31:56.873] name <- restart$name [15:31:56.873] if (is.null(name)) [15:31:56.873] next [15:31:56.873] if (!grepl(pattern, name)) [15:31:56.873] next [15:31:56.873] invokeRestart(restart) [15:31:56.873] muffled <- TRUE [15:31:56.873] break [15:31:56.873] } [15:31:56.873] } [15:31:56.873] } [15:31:56.873] invisible(muffled) [15:31:56.873] } [15:31:56.873] muffleCondition(cond, pattern = "^muffle") [15:31:56.873] } [15:31:56.873] } [15:31:56.873] else { [15:31:56.873] if (TRUE) { [15:31:56.873] muffleCondition <- function (cond, pattern = "^muffle") [15:31:56.873] { [15:31:56.873] inherits <- base::inherits [15:31:56.873] invokeRestart <- base::invokeRestart [15:31:56.873] is.null <- base::is.null [15:31:56.873] muffled <- FALSE [15:31:56.873] if (inherits(cond, "message")) { [15:31:56.873] muffled <- grepl(pattern, "muffleMessage") [15:31:56.873] if (muffled) [15:31:56.873] invokeRestart("muffleMessage") [15:31:56.873] } [15:31:56.873] else if (inherits(cond, "warning")) { [15:31:56.873] muffled <- grepl(pattern, "muffleWarning") [15:31:56.873] if (muffled) [15:31:56.873] invokeRestart("muffleWarning") [15:31:56.873] } [15:31:56.873] else if (inherits(cond, "condition")) { [15:31:56.873] if (!is.null(pattern)) { [15:31:56.873] computeRestarts <- base::computeRestarts [15:31:56.873] grepl <- base::grepl [15:31:56.873] restarts <- computeRestarts(cond) [15:31:56.873] for (restart in restarts) { [15:31:56.873] name <- restart$name [15:31:56.873] if (is.null(name)) [15:31:56.873] next [15:31:56.873] if (!grepl(pattern, name)) [15:31:56.873] next [15:31:56.873] invokeRestart(restart) [15:31:56.873] muffled <- TRUE [15:31:56.873] break [15:31:56.873] } [15:31:56.873] } [15:31:56.873] } [15:31:56.873] invisible(muffled) [15:31:56.873] } [15:31:56.873] muffleCondition(cond, pattern = "^muffle") [15:31:56.873] } [15:31:56.873] } [15:31:56.873] } [15:31:56.873] })) [15:31:56.873] }, error = function(ex) { [15:31:56.873] base::structure(base::list(value = NULL, visible = NULL, [15:31:56.873] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:56.873] ...future.rng), started = ...future.startTime, [15:31:56.873] finished = Sys.time(), session_uuid = NA_character_, [15:31:56.873] version = "1.8"), class = "FutureResult") [15:31:56.873] }, finally = { [15:31:56.873] if (!identical(...future.workdir, getwd())) [15:31:56.873] setwd(...future.workdir) [15:31:56.873] { [15:31:56.873] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:56.873] ...future.oldOptions$nwarnings <- NULL [15:31:56.873] } [15:31:56.873] base::options(...future.oldOptions) [15:31:56.873] if (.Platform$OS.type == "windows") { [15:31:56.873] old_names <- names(...future.oldEnvVars) [15:31:56.873] envs <- base::Sys.getenv() [15:31:56.873] names <- names(envs) [15:31:56.873] common <- intersect(names, old_names) [15:31:56.873] added <- setdiff(names, old_names) [15:31:56.873] removed <- setdiff(old_names, names) [15:31:56.873] changed <- common[...future.oldEnvVars[common] != [15:31:56.873] envs[common]] [15:31:56.873] NAMES <- toupper(changed) [15:31:56.873] args <- list() [15:31:56.873] for (kk in seq_along(NAMES)) { [15:31:56.873] name <- changed[[kk]] [15:31:56.873] NAME <- NAMES[[kk]] [15:31:56.873] if (name != NAME && is.element(NAME, old_names)) [15:31:56.873] next [15:31:56.873] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:56.873] } [15:31:56.873] NAMES <- toupper(added) [15:31:56.873] for (kk in seq_along(NAMES)) { [15:31:56.873] name <- added[[kk]] [15:31:56.873] NAME <- NAMES[[kk]] [15:31:56.873] if (name != NAME && is.element(NAME, old_names)) [15:31:56.873] next [15:31:56.873] args[[name]] <- "" [15:31:56.873] } [15:31:56.873] NAMES <- toupper(removed) [15:31:56.873] for (kk in seq_along(NAMES)) { [15:31:56.873] name <- removed[[kk]] [15:31:56.873] NAME <- NAMES[[kk]] [15:31:56.873] if (name != NAME && is.element(NAME, old_names)) [15:31:56.873] next [15:31:56.873] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:56.873] } [15:31:56.873] if (length(args) > 0) [15:31:56.873] base::do.call(base::Sys.setenv, args = args) [15:31:56.873] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:56.873] } [15:31:56.873] else { [15:31:56.873] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:56.873] } [15:31:56.873] { [15:31:56.873] if (base::length(...future.futureOptionsAdded) > [15:31:56.873] 0L) { [15:31:56.873] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:56.873] base::names(opts) <- ...future.futureOptionsAdded [15:31:56.873] base::options(opts) [15:31:56.873] } [15:31:56.873] { [15:31:56.873] { [15:31:56.873] base::options(mc.cores = ...future.mc.cores.old) [15:31:56.873] NULL [15:31:56.873] } [15:31:56.873] options(future.plan = NULL) [15:31:56.873] if (is.na(NA_character_)) [15:31:56.873] Sys.unsetenv("R_FUTURE_PLAN") [15:31:56.873] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:56.873] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:56.873] .init = FALSE) [15:31:56.873] } [15:31:56.873] } [15:31:56.873] } [15:31:56.873] }) [15:31:56.873] if (TRUE) { [15:31:56.873] base::sink(type = "output", split = FALSE) [15:31:56.873] if (TRUE) { [15:31:56.873] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:56.873] } [15:31:56.873] else { [15:31:56.873] ...future.result["stdout"] <- base::list(NULL) [15:31:56.873] } [15:31:56.873] base::close(...future.stdout) [15:31:56.873] ...future.stdout <- NULL [15:31:56.873] } [15:31:56.873] ...future.result$conditions <- ...future.conditions [15:31:56.873] ...future.result$finished <- base::Sys.time() [15:31:56.873] ...future.result [15:31:56.873] } [15:31:56.882] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:56.883] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:56.883] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:56.884] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:56.885] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:56.885] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [15:31:56.886] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [15:31:56.886] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:56.887] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:56.887] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:56.887] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:56.888] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:56.889] MultisessionFuture started [15:31:56.889] - Launch lazy future ... done [15:31:56.889] run() for 'MultisessionFuture' ... done [15:31:56.890] Created future: [15:31:56.916] receiveMessageFromWorker() for ClusterFuture ... [15:31:56.917] - Validating connection of MultisessionFuture [15:31:56.917] - received message: FutureResult [15:31:56.918] - Received FutureResult [15:31:56.918] - Erased future from FutureRegistry [15:31:56.918] result() for ClusterFuture ... [15:31:56.918] - result already collected: FutureResult [15:31:56.919] result() for ClusterFuture ... done [15:31:56.919] receiveMessageFromWorker() for ClusterFuture ... done [15:31:56.890] MultisessionFuture: [15:31:56.890] Label: 'future_lapply-4' [15:31:56.890] Expression: [15:31:56.890] { [15:31:56.890] do.call(function(...) { [15:31:56.890] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:56.890] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:56.890] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:56.890] on.exit(options(oopts), add = TRUE) [15:31:56.890] } [15:31:56.890] { [15:31:56.890] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:56.890] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:56.890] ...future.FUN(...future.X_jj, ...) [15:31:56.890] }) [15:31:56.890] } [15:31:56.890] }, args = future.call.arguments) [15:31:56.890] } [15:31:56.890] Lazy evaluation: FALSE [15:31:56.890] Asynchronous evaluation: TRUE [15:31:56.890] Local evaluation: TRUE [15:31:56.890] Environment: R_GlobalEnv [15:31:56.890] Capture standard output: TRUE [15:31:56.890] Capture condition classes: 'condition' (excluding 'nothing') [15:31:56.890] Globals: 5 objects totaling 2.30 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:56.890] Packages: [15:31:56.890] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:56.890] Resolved: TRUE [15:31:56.890] Value: [15:31:56.890] Conditions captured: [15:31:56.890] Early signaling: FALSE [15:31:56.890] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:56.890] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:56.920] Chunk #4 of 4 ... DONE [15:31:56.920] Launching 4 futures (chunks) ... DONE [15:31:56.920] Resolving 4 futures (chunks) ... [15:31:56.920] resolve() on list ... [15:31:56.920] recursive: 0 [15:31:56.921] length: 4 [15:31:56.921] [15:31:56.921] Future #1 [15:31:56.921] result() for ClusterFuture ... [15:31:56.922] - result already collected: FutureResult [15:31:56.922] result() for ClusterFuture ... done [15:31:56.922] result() for ClusterFuture ... [15:31:56.923] - result already collected: FutureResult [15:31:56.923] result() for ClusterFuture ... done [15:31:56.923] signalConditionsASAP(MultisessionFuture, pos=1) ... [15:31:56.923] - nx: 4 [15:31:56.924] - relay: TRUE [15:31:56.924] - stdout: TRUE [15:31:56.924] - signal: TRUE [15:31:56.924] - resignal: FALSE [15:31:56.925] - force: TRUE [15:31:56.925] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [15:31:56.925] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [15:31:56.926] - until=1 [15:31:56.926] - relaying element #1 [15:31:56.926] result() for ClusterFuture ... [15:31:56.926] - result already collected: FutureResult [15:31:56.927] result() for ClusterFuture ... done [15:31:56.927] result() for ClusterFuture ... [15:31:56.927] - result already collected: FutureResult [15:31:56.928] result() for ClusterFuture ... done [15:31:56.928] result() for ClusterFuture ... [15:31:56.928] - result already collected: FutureResult [15:31:56.928] result() for ClusterFuture ... done [15:31:56.929] result() for ClusterFuture ... [15:31:56.929] - result already collected: FutureResult [15:31:56.929] result() for ClusterFuture ... done [15:31:56.930] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:56.930] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:56.930] signalConditionsASAP(MultisessionFuture, pos=1) ... done [15:31:56.930] length: 3 (resolved future 1) [15:31:56.931] Future #2 [15:31:56.931] result() for ClusterFuture ... [15:31:56.931] - result already collected: FutureResult [15:31:56.932] result() for ClusterFuture ... done [15:31:56.932] result() for ClusterFuture ... [15:31:56.932] - result already collected: FutureResult [15:31:56.932] result() for ClusterFuture ... done [15:31:56.933] signalConditionsASAP(MultisessionFuture, pos=2) ... [15:31:56.933] - nx: 4 [15:31:56.933] - relay: TRUE [15:31:56.933] - stdout: TRUE [15:31:56.934] - signal: TRUE [15:31:56.934] - resignal: FALSE [15:31:56.934] - force: TRUE [15:31:56.934] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:56.935] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [15:31:56.935] - until=2 [15:31:56.935] - relaying element #2 [15:31:56.936] result() for ClusterFuture ... [15:31:56.936] - result already collected: FutureResult [15:31:56.936] result() for ClusterFuture ... done [15:31:56.936] result() for ClusterFuture ... [15:31:56.937] - result already collected: FutureResult [15:31:56.937] result() for ClusterFuture ... done [15:31:56.937] result() for ClusterFuture ... [15:31:56.938] - result already collected: FutureResult [15:31:56.938] result() for ClusterFuture ... done [15:31:56.938] result() for ClusterFuture ... [15:31:56.938] - result already collected: FutureResult [15:31:56.939] result() for ClusterFuture ... done [15:31:56.939] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:56.939] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:56.939] signalConditionsASAP(MultisessionFuture, pos=2) ... done [15:31:56.940] length: 2 (resolved future 2) [15:31:56.940] Future #3 [15:31:56.940] result() for ClusterFuture ... [15:31:56.941] - result already collected: FutureResult [15:31:56.941] result() for ClusterFuture ... done [15:31:56.941] result() for ClusterFuture ... [15:31:56.942] - result already collected: FutureResult [15:31:56.942] result() for ClusterFuture ... done [15:31:56.942] signalConditionsASAP(MultisessionFuture, pos=3) ... [15:31:56.942] - nx: 4 [15:31:56.943] - relay: TRUE [15:31:56.943] - stdout: TRUE [15:31:56.943] - signal: TRUE [15:31:56.943] - resignal: FALSE [15:31:56.944] - force: TRUE [15:31:56.944] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:56.944] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [15:31:56.945] - until=3 [15:31:56.948] - relaying element #3 [15:31:56.948] result() for ClusterFuture ... [15:31:56.949] - result already collected: FutureResult [15:31:56.949] result() for ClusterFuture ... done [15:31:56.949] result() for ClusterFuture ... [15:31:56.949] - result already collected: FutureResult [15:31:56.949] result() for ClusterFuture ... done [15:31:56.949] result() for ClusterFuture ... [15:31:56.950] - result already collected: FutureResult [15:31:56.950] result() for ClusterFuture ... done [15:31:56.950] result() for ClusterFuture ... [15:31:56.950] - result already collected: FutureResult [15:31:56.950] result() for ClusterFuture ... done [15:31:56.950] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:56.951] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:56.951] signalConditionsASAP(MultisessionFuture, pos=3) ... done [15:31:56.951] length: 1 (resolved future 3) [15:31:56.951] Future #4 [15:31:56.951] result() for ClusterFuture ... [15:31:56.951] - result already collected: FutureResult [15:31:56.952] result() for ClusterFuture ... done [15:31:56.952] result() for ClusterFuture ... [15:31:56.952] - result already collected: FutureResult [15:31:56.952] result() for ClusterFuture ... done [15:31:56.952] signalConditionsASAP(MultisessionFuture, pos=4) ... [15:31:56.953] - nx: 4 [15:31:56.953] - relay: TRUE [15:31:56.953] - stdout: TRUE [15:31:56.953] - signal: TRUE [15:31:56.953] - resignal: FALSE [15:31:56.953] - force: TRUE [15:31:56.953] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:56.954] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [15:31:56.954] - until=4 [15:31:56.954] - relaying element #4 [15:31:56.954] result() for ClusterFuture ... [15:31:56.954] - result already collected: FutureResult [15:31:56.954] result() for ClusterFuture ... done [15:31:56.955] result() for ClusterFuture ... [15:31:56.955] - result already collected: FutureResult [15:31:56.955] result() for ClusterFuture ... done [15:31:56.955] result() for ClusterFuture ... [15:31:56.955] - result already collected: FutureResult [15:31:56.955] result() for ClusterFuture ... done [15:31:56.956] result() for ClusterFuture ... [15:31:56.956] - result already collected: FutureResult [15:31:56.956] result() for ClusterFuture ... done [15:31:56.956] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:56.956] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:56.956] signalConditionsASAP(MultisessionFuture, pos=4) ... done [15:31:56.957] length: 0 (resolved future 4) [15:31:56.957] Relaying remaining futures [15:31:56.957] signalConditionsASAP(NULL, pos=0) ... [15:31:56.957] - nx: 4 [15:31:56.957] - relay: TRUE [15:31:56.957] - stdout: TRUE [15:31:56.958] - signal: TRUE [15:31:56.958] - resignal: FALSE [15:31:56.958] - force: TRUE [15:31:56.958] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:56.958] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [15:31:56.958] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:56.959] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [15:31:56.959] signalConditionsASAP(NULL, pos=0) ... done [15:31:56.959] resolve() on list ... DONE [15:31:56.959] result() for ClusterFuture ... [15:31:56.959] - result already collected: FutureResult [15:31:56.959] result() for ClusterFuture ... done [15:31:56.960] result() for ClusterFuture ... [15:31:56.960] - result already collected: FutureResult [15:31:56.960] result() for ClusterFuture ... done [15:31:56.960] result() for ClusterFuture ... [15:31:56.960] - result already collected: FutureResult [15:31:56.960] result() for ClusterFuture ... done [15:31:56.961] result() for ClusterFuture ... [15:31:56.961] - result already collected: FutureResult [15:31:56.961] result() for ClusterFuture ... done [15:31:56.961] result() for ClusterFuture ... [15:31:56.961] - result already collected: FutureResult [15:31:56.961] result() for ClusterFuture ... done [15:31:56.962] result() for ClusterFuture ... [15:31:56.962] - result already collected: FutureResult [15:31:56.962] result() for ClusterFuture ... done [15:31:56.962] result() for ClusterFuture ... [15:31:56.962] - result already collected: FutureResult [15:31:56.962] result() for ClusterFuture ... done [15:31:56.963] result() for ClusterFuture ... [15:31:56.963] - result already collected: FutureResult [15:31:56.963] result() for ClusterFuture ... done [15:31:56.963] - Number of value chunks collected: 4 [15:31:56.963] Resolving 4 futures (chunks) ... DONE [15:31:56.963] Reducing values from 4 chunks ... [15:31:56.964] - Number of values collected after concatenation: 4 [15:31:56.964] - Number of values expected: 4 [15:31:56.964] Reducing values from 4 chunks ... DONE [15:31:56.964] 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, ...) ... [15:31:56.967] future_lapply() ... [15:31:56.978] Number of chunks: 1 [15:31:56.978] getGlobalsAndPackagesXApply() ... [15:31:56.979] - future.globals: TRUE [15:31:56.979] getGlobalsAndPackages() ... [15:31:56.979] Searching for globals... [15:31:56.989] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [15:31:56.990] Searching for globals ... DONE [15:31:56.990] Resolving globals: FALSE [15:31:56.991] The total size of the 1 globals is 69.62 KiB (71288 bytes) [15:31:56.992] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 69.62 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (69.62 KiB of class 'function') [15:31:56.992] - globals: [1] 'FUN' [15:31:56.993] - packages: [1] 'future' [15:31:56.993] getGlobalsAndPackages() ... DONE [15:31:56.993] - globals found/used: [n=1] 'FUN' [15:31:56.993] - needed namespaces: [n=1] 'future' [15:31:56.993] Finding globals ... DONE [15:31:56.994] - use_args: TRUE [15:31:56.994] - Getting '...' globals ... [15:31:56.994] resolve() on list ... [15:31:56.994] recursive: 0 [15:31:56.995] length: 1 [15:31:56.995] elements: '...' [15:31:56.995] length: 0 (resolved future 1) [15:31:56.995] resolve() on list ... DONE [15:31:56.995] - '...' content: [n=2] 'collapse', 'maxHead' [15:31:56.995] List of 1 [15:31:56.995] $ ...:List of 2 [15:31:56.995] ..$ collapse: chr "; " [15:31:56.995] ..$ maxHead : int 3 [15:31:56.995] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:56.995] - attr(*, "where")=List of 1 [15:31:56.995] ..$ ...: [15:31:56.995] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:56.995] - attr(*, "resolved")= logi TRUE [15:31:56.995] - attr(*, "total_size")= num NA [15:31:57.000] - Getting '...' globals ... DONE [15:31:57.000] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:57.001] List of 2 [15:31:57.001] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:57.001] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:57.001] $ ... :List of 2 [15:31:57.001] ..$ collapse: chr "; " [15:31:57.001] ..$ maxHead : int 3 [15:31:57.001] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:57.001] - attr(*, "where")=List of 2 [15:31:57.001] ..$ ...future.FUN: [15:31:57.001] ..$ ... : [15:31:57.001] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:57.001] - attr(*, "resolved")= logi FALSE [15:31:57.001] - attr(*, "total_size")= num 71456 [15:31:57.005] Packages to be attached in all futures: [n=1] 'future' [15:31:57.006] getGlobalsAndPackagesXApply() ... DONE [15:31:57.006] Number of futures (= number of chunks): 1 [15:31:57.006] Launching 1 futures (chunks) ... [15:31:57.006] Chunk #1 of 1 ... [15:31:57.006] - Finding globals in 'X' for chunk #1 ... [15:31:57.007] getGlobalsAndPackages() ... [15:31:57.007] Searching for globals... [15:31:57.007] [15:31:57.007] Searching for globals ... DONE [15:31:57.008] - globals: [0] [15:31:57.008] getGlobalsAndPackages() ... DONE [15:31:57.008] + additional globals found: [n=0] [15:31:57.008] + additional namespaces needed: [n=0] [15:31:57.008] - Finding globals in 'X' for chunk #1 ... DONE [15:31:57.009] - seeds: [15:31:57.009] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.009] getGlobalsAndPackages() ... [15:31:57.009] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.010] Resolving globals: FALSE [15:31:57.010] Tweak future expression to call with '...' arguments ... [15:31:57.010] { [15:31:57.010] do.call(function(...) { [15:31:57.010] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.010] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:57.010] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.010] on.exit(options(oopts), add = TRUE) [15:31:57.010] } [15:31:57.010] { [15:31:57.010] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:57.010] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.010] ...future.FUN(...future.X_jj, ...) [15:31:57.010] }) [15:31:57.010] } [15:31:57.010] }, args = future.call.arguments) [15:31:57.010] } [15:31:57.011] Tweak future expression to call with '...' arguments ... DONE [15:31:57.012] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.012] - packages: [1] 'future' [15:31:57.013] getGlobalsAndPackages() ... DONE [15:31:57.013] run() for 'Future' ... [15:31:57.013] - state: 'created' [15:31:57.014] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:57.030] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:57.031] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:57.031] - Field: 'node' [15:31:57.031] - Field: 'label' [15:31:57.032] - Field: 'local' [15:31:57.032] - Field: 'owner' [15:31:57.032] - Field: 'envir' [15:31:57.032] - Field: 'workers' [15:31:57.033] - Field: 'packages' [15:31:57.033] - Field: 'gc' [15:31:57.033] - Field: 'conditions' [15:31:57.034] - Field: 'persistent' [15:31:57.034] - Field: 'expr' [15:31:57.034] - Field: 'uuid' [15:31:57.034] - Field: 'seed' [15:31:57.035] - Field: 'version' [15:31:57.035] - Field: 'result' [15:31:57.035] - Field: 'asynchronous' [15:31:57.036] - Field: 'calls' [15:31:57.036] - Field: 'globals' [15:31:57.036] - Field: 'stdout' [15:31:57.036] - Field: 'earlySignal' [15:31:57.037] - Field: 'lazy' [15:31:57.037] - Field: 'state' [15:31:57.037] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:57.038] - Launch lazy future ... [15:31:57.038] Packages needed by the future expression (n = 1): 'future' [15:31:57.039] Packages needed by future strategies (n = 0): [15:31:57.040] { [15:31:57.040] { [15:31:57.040] { [15:31:57.040] ...future.startTime <- base::Sys.time() [15:31:57.040] { [15:31:57.040] { [15:31:57.040] { [15:31:57.040] { [15:31:57.040] { [15:31:57.040] base::local({ [15:31:57.040] has_future <- base::requireNamespace("future", [15:31:57.040] quietly = TRUE) [15:31:57.040] if (has_future) { [15:31:57.040] ns <- base::getNamespace("future") [15:31:57.040] version <- ns[[".package"]][["version"]] [15:31:57.040] if (is.null(version)) [15:31:57.040] version <- utils::packageVersion("future") [15:31:57.040] } [15:31:57.040] else { [15:31:57.040] version <- NULL [15:31:57.040] } [15:31:57.040] if (!has_future || version < "1.8.0") { [15:31:57.040] info <- base::c(r_version = base::gsub("R version ", [15:31:57.040] "", base::R.version$version.string), [15:31:57.040] platform = base::sprintf("%s (%s-bit)", [15:31:57.040] base::R.version$platform, 8 * [15:31:57.040] base::.Machine$sizeof.pointer), [15:31:57.040] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:57.040] "release", "version")], collapse = " "), [15:31:57.040] hostname = base::Sys.info()[["nodename"]]) [15:31:57.040] info <- base::sprintf("%s: %s", base::names(info), [15:31:57.040] info) [15:31:57.040] info <- base::paste(info, collapse = "; ") [15:31:57.040] if (!has_future) { [15:31:57.040] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:57.040] info) [15:31:57.040] } [15:31:57.040] else { [15:31:57.040] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:57.040] info, version) [15:31:57.040] } [15:31:57.040] base::stop(msg) [15:31:57.040] } [15:31:57.040] }) [15:31:57.040] } [15:31:57.040] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:57.040] base::options(mc.cores = 1L) [15:31:57.040] } [15:31:57.040] base::local({ [15:31:57.040] for (pkg in "future") { [15:31:57.040] base::loadNamespace(pkg) [15:31:57.040] base::library(pkg, character.only = TRUE) [15:31:57.040] } [15:31:57.040] }) [15:31:57.040] } [15:31:57.040] ...future.strategy.old <- future::plan("list") [15:31:57.040] options(future.plan = NULL) [15:31:57.040] Sys.unsetenv("R_FUTURE_PLAN") [15:31:57.040] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:57.040] } [15:31:57.040] ...future.workdir <- getwd() [15:31:57.040] } [15:31:57.040] ...future.oldOptions <- base::as.list(base::.Options) [15:31:57.040] ...future.oldEnvVars <- base::Sys.getenv() [15:31:57.040] } [15:31:57.040] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:57.040] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:57.040] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:57.040] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:57.040] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:57.040] future.stdout.windows.reencode = NULL, width = 80L) [15:31:57.040] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:57.040] base::names(...future.oldOptions)) [15:31:57.040] } [15:31:57.040] if (FALSE) { [15:31:57.040] } [15:31:57.040] else { [15:31:57.040] if (TRUE) { [15:31:57.040] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:57.040] open = "w") [15:31:57.040] } [15:31:57.040] else { [15:31:57.040] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:57.040] windows = "NUL", "/dev/null"), open = "w") [15:31:57.040] } [15:31:57.040] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:57.040] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:57.040] base::sink(type = "output", split = FALSE) [15:31:57.040] base::close(...future.stdout) [15:31:57.040] }, add = TRUE) [15:31:57.040] } [15:31:57.040] ...future.frame <- base::sys.nframe() [15:31:57.040] ...future.conditions <- base::list() [15:31:57.040] ...future.rng <- base::globalenv()$.Random.seed [15:31:57.040] if (FALSE) { [15:31:57.040] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:57.040] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:57.040] } [15:31:57.040] ...future.result <- base::tryCatch({ [15:31:57.040] base::withCallingHandlers({ [15:31:57.040] ...future.value <- base::withVisible(base::local({ [15:31:57.040] ...future.makeSendCondition <- base::local({ [15:31:57.040] sendCondition <- NULL [15:31:57.040] function(frame = 1L) { [15:31:57.040] if (is.function(sendCondition)) [15:31:57.040] return(sendCondition) [15:31:57.040] ns <- getNamespace("parallel") [15:31:57.040] if (exists("sendData", mode = "function", [15:31:57.040] envir = ns)) { [15:31:57.040] parallel_sendData <- get("sendData", mode = "function", [15:31:57.040] envir = ns) [15:31:57.040] envir <- sys.frame(frame) [15:31:57.040] master <- NULL [15:31:57.040] while (!identical(envir, .GlobalEnv) && [15:31:57.040] !identical(envir, emptyenv())) { [15:31:57.040] if (exists("master", mode = "list", envir = envir, [15:31:57.040] inherits = FALSE)) { [15:31:57.040] master <- get("master", mode = "list", [15:31:57.040] envir = envir, inherits = FALSE) [15:31:57.040] if (inherits(master, c("SOCKnode", [15:31:57.040] "SOCK0node"))) { [15:31:57.040] sendCondition <<- function(cond) { [15:31:57.040] data <- list(type = "VALUE", value = cond, [15:31:57.040] success = TRUE) [15:31:57.040] parallel_sendData(master, data) [15:31:57.040] } [15:31:57.040] return(sendCondition) [15:31:57.040] } [15:31:57.040] } [15:31:57.040] frame <- frame + 1L [15:31:57.040] envir <- sys.frame(frame) [15:31:57.040] } [15:31:57.040] } [15:31:57.040] sendCondition <<- function(cond) NULL [15:31:57.040] } [15:31:57.040] }) [15:31:57.040] withCallingHandlers({ [15:31:57.040] { [15:31:57.040] do.call(function(...) { [15:31:57.040] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.040] if (!identical(...future.globals.maxSize.org, [15:31:57.040] ...future.globals.maxSize)) { [15:31:57.040] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.040] on.exit(options(oopts), add = TRUE) [15:31:57.040] } [15:31:57.040] { [15:31:57.040] lapply(seq_along(...future.elements_ii), [15:31:57.040] FUN = function(jj) { [15:31:57.040] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.040] ...future.FUN(...future.X_jj, ...) [15:31:57.040] }) [15:31:57.040] } [15:31:57.040] }, args = future.call.arguments) [15:31:57.040] } [15:31:57.040] }, immediateCondition = function(cond) { [15:31:57.040] sendCondition <- ...future.makeSendCondition() [15:31:57.040] sendCondition(cond) [15:31:57.040] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.040] { [15:31:57.040] inherits <- base::inherits [15:31:57.040] invokeRestart <- base::invokeRestart [15:31:57.040] is.null <- base::is.null [15:31:57.040] muffled <- FALSE [15:31:57.040] if (inherits(cond, "message")) { [15:31:57.040] muffled <- grepl(pattern, "muffleMessage") [15:31:57.040] if (muffled) [15:31:57.040] invokeRestart("muffleMessage") [15:31:57.040] } [15:31:57.040] else if (inherits(cond, "warning")) { [15:31:57.040] muffled <- grepl(pattern, "muffleWarning") [15:31:57.040] if (muffled) [15:31:57.040] invokeRestart("muffleWarning") [15:31:57.040] } [15:31:57.040] else if (inherits(cond, "condition")) { [15:31:57.040] if (!is.null(pattern)) { [15:31:57.040] computeRestarts <- base::computeRestarts [15:31:57.040] grepl <- base::grepl [15:31:57.040] restarts <- computeRestarts(cond) [15:31:57.040] for (restart in restarts) { [15:31:57.040] name <- restart$name [15:31:57.040] if (is.null(name)) [15:31:57.040] next [15:31:57.040] if (!grepl(pattern, name)) [15:31:57.040] next [15:31:57.040] invokeRestart(restart) [15:31:57.040] muffled <- TRUE [15:31:57.040] break [15:31:57.040] } [15:31:57.040] } [15:31:57.040] } [15:31:57.040] invisible(muffled) [15:31:57.040] } [15:31:57.040] muffleCondition(cond) [15:31:57.040] }) [15:31:57.040] })) [15:31:57.040] future::FutureResult(value = ...future.value$value, [15:31:57.040] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:57.040] ...future.rng), globalenv = if (FALSE) [15:31:57.040] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:57.040] ...future.globalenv.names)) [15:31:57.040] else NULL, started = ...future.startTime, version = "1.8") [15:31:57.040] }, condition = base::local({ [15:31:57.040] c <- base::c [15:31:57.040] inherits <- base::inherits [15:31:57.040] invokeRestart <- base::invokeRestart [15:31:57.040] length <- base::length [15:31:57.040] list <- base::list [15:31:57.040] seq.int <- base::seq.int [15:31:57.040] signalCondition <- base::signalCondition [15:31:57.040] sys.calls <- base::sys.calls [15:31:57.040] `[[` <- base::`[[` [15:31:57.040] `+` <- base::`+` [15:31:57.040] `<<-` <- base::`<<-` [15:31:57.040] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:57.040] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:57.040] 3L)] [15:31:57.040] } [15:31:57.040] function(cond) { [15:31:57.040] is_error <- inherits(cond, "error") [15:31:57.040] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:57.040] NULL) [15:31:57.040] if (is_error) { [15:31:57.040] sessionInformation <- function() { [15:31:57.040] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:57.040] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:57.040] search = base::search(), system = base::Sys.info()) [15:31:57.040] } [15:31:57.040] ...future.conditions[[length(...future.conditions) + [15:31:57.040] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:57.040] cond$call), session = sessionInformation(), [15:31:57.040] timestamp = base::Sys.time(), signaled = 0L) [15:31:57.040] signalCondition(cond) [15:31:57.040] } [15:31:57.040] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:57.040] "immediateCondition"))) { [15:31:57.040] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:57.040] ...future.conditions[[length(...future.conditions) + [15:31:57.040] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:57.040] if (TRUE && !signal) { [15:31:57.040] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.040] { [15:31:57.040] inherits <- base::inherits [15:31:57.040] invokeRestart <- base::invokeRestart [15:31:57.040] is.null <- base::is.null [15:31:57.040] muffled <- FALSE [15:31:57.040] if (inherits(cond, "message")) { [15:31:57.040] muffled <- grepl(pattern, "muffleMessage") [15:31:57.040] if (muffled) [15:31:57.040] invokeRestart("muffleMessage") [15:31:57.040] } [15:31:57.040] else if (inherits(cond, "warning")) { [15:31:57.040] muffled <- grepl(pattern, "muffleWarning") [15:31:57.040] if (muffled) [15:31:57.040] invokeRestart("muffleWarning") [15:31:57.040] } [15:31:57.040] else if (inherits(cond, "condition")) { [15:31:57.040] if (!is.null(pattern)) { [15:31:57.040] computeRestarts <- base::computeRestarts [15:31:57.040] grepl <- base::grepl [15:31:57.040] restarts <- computeRestarts(cond) [15:31:57.040] for (restart in restarts) { [15:31:57.040] name <- restart$name [15:31:57.040] if (is.null(name)) [15:31:57.040] next [15:31:57.040] if (!grepl(pattern, name)) [15:31:57.040] next [15:31:57.040] invokeRestart(restart) [15:31:57.040] muffled <- TRUE [15:31:57.040] break [15:31:57.040] } [15:31:57.040] } [15:31:57.040] } [15:31:57.040] invisible(muffled) [15:31:57.040] } [15:31:57.040] muffleCondition(cond, pattern = "^muffle") [15:31:57.040] } [15:31:57.040] } [15:31:57.040] else { [15:31:57.040] if (TRUE) { [15:31:57.040] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.040] { [15:31:57.040] inherits <- base::inherits [15:31:57.040] invokeRestart <- base::invokeRestart [15:31:57.040] is.null <- base::is.null [15:31:57.040] muffled <- FALSE [15:31:57.040] if (inherits(cond, "message")) { [15:31:57.040] muffled <- grepl(pattern, "muffleMessage") [15:31:57.040] if (muffled) [15:31:57.040] invokeRestart("muffleMessage") [15:31:57.040] } [15:31:57.040] else if (inherits(cond, "warning")) { [15:31:57.040] muffled <- grepl(pattern, "muffleWarning") [15:31:57.040] if (muffled) [15:31:57.040] invokeRestart("muffleWarning") [15:31:57.040] } [15:31:57.040] else if (inherits(cond, "condition")) { [15:31:57.040] if (!is.null(pattern)) { [15:31:57.040] computeRestarts <- base::computeRestarts [15:31:57.040] grepl <- base::grepl [15:31:57.040] restarts <- computeRestarts(cond) [15:31:57.040] for (restart in restarts) { [15:31:57.040] name <- restart$name [15:31:57.040] if (is.null(name)) [15:31:57.040] next [15:31:57.040] if (!grepl(pattern, name)) [15:31:57.040] next [15:31:57.040] invokeRestart(restart) [15:31:57.040] muffled <- TRUE [15:31:57.040] break [15:31:57.040] } [15:31:57.040] } [15:31:57.040] } [15:31:57.040] invisible(muffled) [15:31:57.040] } [15:31:57.040] muffleCondition(cond, pattern = "^muffle") [15:31:57.040] } [15:31:57.040] } [15:31:57.040] } [15:31:57.040] })) [15:31:57.040] }, error = function(ex) { [15:31:57.040] base::structure(base::list(value = NULL, visible = NULL, [15:31:57.040] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:57.040] ...future.rng), started = ...future.startTime, [15:31:57.040] finished = Sys.time(), session_uuid = NA_character_, [15:31:57.040] version = "1.8"), class = "FutureResult") [15:31:57.040] }, finally = { [15:31:57.040] if (!identical(...future.workdir, getwd())) [15:31:57.040] setwd(...future.workdir) [15:31:57.040] { [15:31:57.040] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:57.040] ...future.oldOptions$nwarnings <- NULL [15:31:57.040] } [15:31:57.040] base::options(...future.oldOptions) [15:31:57.040] if (.Platform$OS.type == "windows") { [15:31:57.040] old_names <- names(...future.oldEnvVars) [15:31:57.040] envs <- base::Sys.getenv() [15:31:57.040] names <- names(envs) [15:31:57.040] common <- intersect(names, old_names) [15:31:57.040] added <- setdiff(names, old_names) [15:31:57.040] removed <- setdiff(old_names, names) [15:31:57.040] changed <- common[...future.oldEnvVars[common] != [15:31:57.040] envs[common]] [15:31:57.040] NAMES <- toupper(changed) [15:31:57.040] args <- list() [15:31:57.040] for (kk in seq_along(NAMES)) { [15:31:57.040] name <- changed[[kk]] [15:31:57.040] NAME <- NAMES[[kk]] [15:31:57.040] if (name != NAME && is.element(NAME, old_names)) [15:31:57.040] next [15:31:57.040] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:57.040] } [15:31:57.040] NAMES <- toupper(added) [15:31:57.040] for (kk in seq_along(NAMES)) { [15:31:57.040] name <- added[[kk]] [15:31:57.040] NAME <- NAMES[[kk]] [15:31:57.040] if (name != NAME && is.element(NAME, old_names)) [15:31:57.040] next [15:31:57.040] args[[name]] <- "" [15:31:57.040] } [15:31:57.040] NAMES <- toupper(removed) [15:31:57.040] for (kk in seq_along(NAMES)) { [15:31:57.040] name <- removed[[kk]] [15:31:57.040] NAME <- NAMES[[kk]] [15:31:57.040] if (name != NAME && is.element(NAME, old_names)) [15:31:57.040] next [15:31:57.040] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:57.040] } [15:31:57.040] if (length(args) > 0) [15:31:57.040] base::do.call(base::Sys.setenv, args = args) [15:31:57.040] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:57.040] } [15:31:57.040] else { [15:31:57.040] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:57.040] } [15:31:57.040] { [15:31:57.040] if (base::length(...future.futureOptionsAdded) > [15:31:57.040] 0L) { [15:31:57.040] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:57.040] base::names(opts) <- ...future.futureOptionsAdded [15:31:57.040] base::options(opts) [15:31:57.040] } [15:31:57.040] { [15:31:57.040] { [15:31:57.040] base::options(mc.cores = ...future.mc.cores.old) [15:31:57.040] NULL [15:31:57.040] } [15:31:57.040] options(future.plan = NULL) [15:31:57.040] if (is.na(NA_character_)) [15:31:57.040] Sys.unsetenv("R_FUTURE_PLAN") [15:31:57.040] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:57.040] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:57.040] .init = FALSE) [15:31:57.040] } [15:31:57.040] } [15:31:57.040] } [15:31:57.040] }) [15:31:57.040] if (TRUE) { [15:31:57.040] base::sink(type = "output", split = FALSE) [15:31:57.040] if (TRUE) { [15:31:57.040] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:57.040] } [15:31:57.040] else { [15:31:57.040] ...future.result["stdout"] <- base::list(NULL) [15:31:57.040] } [15:31:57.040] base::close(...future.stdout) [15:31:57.040] ...future.stdout <- NULL [15:31:57.040] } [15:31:57.040] ...future.result$conditions <- ...future.conditions [15:31:57.040] ...future.result$finished <- base::Sys.time() [15:31:57.040] ...future.result [15:31:57.040] } [15:31:57.049] Exporting 5 global objects (69.78 KiB) to cluster node #1 ... [15:31:57.050] Exporting '...future.FUN' (69.62 KiB) to cluster node #1 ... [15:31:57.051] Exporting '...future.FUN' (69.62 KiB) to cluster node #1 ... DONE [15:31:57.051] Exporting 'future.call.arguments' (168 bytes) to cluster node #1 ... [15:31:57.052] Exporting 'future.call.arguments' (168 bytes) to cluster node #1 ... DONE [15:31:57.052] Exporting '...future.elements_ii' (12.83 KiB) to cluster node #1 ... [15:31:57.053] Exporting '...future.elements_ii' (12.83 KiB) to cluster node #1 ... DONE [15:31:57.053] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:57.054] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:57.054] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:57.055] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:57.055] Exporting 5 global objects (69.78 KiB) to cluster node #1 ... DONE [15:31:57.056] MultisessionFuture started [15:31:57.057] - Launch lazy future ... done [15:31:57.057] run() for 'MultisessionFuture' ... done [15:31:57.057] Created future: [15:31:57.078] receiveMessageFromWorker() for ClusterFuture ... [15:31:57.079] - Validating connection of MultisessionFuture [15:31:57.080] - received message: FutureResult [15:31:57.080] - Received FutureResult [15:31:57.080] - Erased future from FutureRegistry [15:31:57.081] result() for ClusterFuture ... [15:31:57.081] - result already collected: FutureResult [15:31:57.081] result() for ClusterFuture ... done [15:31:57.082] receiveMessageFromWorker() for ClusterFuture ... done [15:31:57.058] MultisessionFuture: [15:31:57.058] Label: 'future_lapply-1' [15:31:57.058] Expression: [15:31:57.058] { [15:31:57.058] do.call(function(...) { [15:31:57.058] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.058] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:57.058] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.058] on.exit(options(oopts), add = TRUE) [15:31:57.058] } [15:31:57.058] { [15:31:57.058] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:57.058] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.058] ...future.FUN(...future.X_jj, ...) [15:31:57.058] }) [15:31:57.058] } [15:31:57.058] }, args = future.call.arguments) [15:31:57.058] } [15:31:57.058] Lazy evaluation: FALSE [15:31:57.058] Asynchronous evaluation: TRUE [15:31:57.058] Local evaluation: TRUE [15:31:57.058] Environment: R_GlobalEnv [15:31:57.058] Capture standard output: TRUE [15:31:57.058] Capture condition classes: 'condition' (excluding 'nothing') [15:31:57.058] Globals: 5 objects totaling 82.61 KiB (function '...future.FUN' of 69.62 KiB, DotDotDotList 'future.call.arguments' of 168 bytes, list '...future.elements_ii' of 12.83 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:57.058] Packages: 1 packages ('future') [15:31:57.058] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:57.058] Resolved: TRUE [15:31:57.058] Value: [15:31:57.058] Conditions captured: [15:31:57.058] Early signaling: FALSE [15:31:57.058] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:57.058] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:57.083] Chunk #1 of 1 ... DONE [15:31:57.083] Launching 1 futures (chunks) ... DONE [15:31:57.083] Resolving 1 futures (chunks) ... [15:31:57.083] resolve() on list ... [15:31:57.084] recursive: 0 [15:31:57.084] length: 1 [15:31:57.084] [15:31:57.085] Future #1 [15:31:57.085] result() for ClusterFuture ... [15:31:57.085] - result already collected: FutureResult [15:31:57.085] result() for ClusterFuture ... done [15:31:57.086] result() for ClusterFuture ... [15:31:57.086] - result already collected: FutureResult [15:31:57.086] result() for ClusterFuture ... done [15:31:57.087] signalConditionsASAP(MultisessionFuture, pos=1) ... [15:31:57.087] - nx: 1 [15:31:57.087] - relay: TRUE [15:31:57.088] - stdout: TRUE [15:31:57.088] - signal: TRUE [15:31:57.088] - resignal: FALSE [15:31:57.088] - force: TRUE [15:31:57.089] - relayed: [n=1] FALSE [15:31:57.089] - queued futures: [n=1] FALSE [15:31:57.089] - until=1 [15:31:57.089] - relaying element #1 [15:31:57.090] result() for ClusterFuture ... [15:31:57.090] - result already collected: FutureResult [15:31:57.090] result() for ClusterFuture ... done [15:31:57.091] result() for ClusterFuture ... [15:31:57.091] - result already collected: FutureResult [15:31:57.091] result() for ClusterFuture ... done [15:31:57.091] result() for ClusterFuture ... [15:31:57.092] - result already collected: FutureResult [15:31:57.092] result() for ClusterFuture ... done [15:31:57.092] result() for ClusterFuture ... [15:31:57.093] - result already collected: FutureResult [15:31:57.093] result() for ClusterFuture ... done [15:31:57.093] - relayed: [n=1] TRUE [15:31:57.093] - queued futures: [n=1] TRUE [15:31:57.094] signalConditionsASAP(MultisessionFuture, pos=1) ... done [15:31:57.094] length: 0 (resolved future 1) [15:31:57.094] Relaying remaining futures [15:31:57.094] signalConditionsASAP(NULL, pos=0) ... [15:31:57.095] - nx: 1 [15:31:57.095] - relay: TRUE [15:31:57.095] - stdout: TRUE [15:31:57.095] - signal: TRUE [15:31:57.096] - resignal: FALSE [15:31:57.096] - force: TRUE [15:31:57.096] - relayed: [n=1] TRUE [15:31:57.097] - queued futures: [n=1] TRUE - flush all [15:31:57.097] - relayed: [n=1] TRUE [15:31:57.097] - queued futures: [n=1] TRUE [15:31:57.098] signalConditionsASAP(NULL, pos=0) ... done [15:31:57.098] resolve() on list ... DONE [15:31:57.098] result() for ClusterFuture ... [15:31:57.098] - result already collected: FutureResult [15:31:57.099] result() for ClusterFuture ... done [15:31:57.099] result() for ClusterFuture ... [15:31:57.099] - result already collected: FutureResult [15:31:57.100] result() for ClusterFuture ... done [15:31:57.100] - Number of value chunks collected: 1 [15:31:57.100] Resolving 1 futures (chunks) ... DONE [15:31:57.101] Reducing values from 1 chunks ... [15:31:57.101] - Number of values collected after concatenation: 1 [15:31:57.101] - Number of values expected: 1 [15:31:57.101] Reducing values from 1 chunks ... DONE [15:31:57.102] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [15:31:57.104] future_lapply() ... [15:31:57.109] Number of chunks: 2 [15:31:57.109] getGlobalsAndPackagesXApply() ... [15:31:57.109] - future.globals: TRUE [15:31:57.110] getGlobalsAndPackages() ... [15:31:57.110] Searching for globals... [15:31:57.112] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [15:31:57.113] Searching for globals ... DONE [15:31:57.113] Resolving globals: FALSE [15:31:57.114] The total size of the 1 globals is 4.85 KiB (4968 bytes) [15:31:57.114] The total size of the 1 globals exported for future expression ('FUN()') is 4.85 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (4.85 KiB of class 'function') [15:31:57.115] - globals: [1] 'FUN' [15:31:57.115] - packages: [1] 'listenv' [15:31:57.115] getGlobalsAndPackages() ... DONE [15:31:57.116] - globals found/used: [n=1] 'FUN' [15:31:57.116] - needed namespaces: [n=1] 'listenv' [15:31:57.116] Finding globals ... DONE [15:31:57.116] - use_args: TRUE [15:31:57.117] - Getting '...' globals ... [15:31:57.117] resolve() on list ... [15:31:57.118] recursive: 0 [15:31:57.118] length: 1 [15:31:57.118] elements: '...' [15:31:57.118] length: 0 (resolved future 1) [15:31:57.119] resolve() on list ... DONE [15:31:57.119] - '...' content: [n=0] [15:31:57.119] List of 1 [15:31:57.119] $ ...: list() [15:31:57.119] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:57.119] - attr(*, "where")=List of 1 [15:31:57.119] ..$ ...: [15:31:57.119] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:57.119] - attr(*, "resolved")= logi TRUE [15:31:57.119] - attr(*, "total_size")= num NA [15:31:57.124] - Getting '...' globals ... DONE [15:31:57.124] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:57.125] List of 2 [15:31:57.125] $ ...future.FUN:function (x, ...) [15:31:57.125] $ ... : list() [15:31:57.125] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:57.125] - attr(*, "where")=List of 2 [15:31:57.125] ..$ ...future.FUN: [15:31:57.125] ..$ ... : [15:31:57.125] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:57.125] - attr(*, "resolved")= logi FALSE [15:31:57.125] - attr(*, "total_size")= num 4968 [15:31:57.133] Packages to be attached in all futures: [n=1] 'listenv' [15:31:57.134] getGlobalsAndPackagesXApply() ... DONE [15:31:57.134] Number of futures (= number of chunks): 2 [15:31:57.135] Launching 2 futures (chunks) ... [15:31:57.135] Chunk #1 of 2 ... [15:31:57.135] - Finding globals in 'X' for chunk #1 ... [15:31:57.136] getGlobalsAndPackages() ... [15:31:57.136] Searching for globals... [15:31:57.137] [15:31:57.137] Searching for globals ... DONE [15:31:57.137] - globals: [0] [15:31:57.138] getGlobalsAndPackages() ... DONE [15:31:57.138] + additional globals found: [n=0] [15:31:57.138] + additional namespaces needed: [n=0] [15:31:57.138] - Finding globals in 'X' for chunk #1 ... DONE [15:31:57.139] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:57.139] - seeds: [15:31:57.139] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.140] getGlobalsAndPackages() ... [15:31:57.140] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.140] Resolving globals: FALSE [15:31:57.141] Tweak future expression to call with '...' arguments ... [15:31:57.141] { [15:31:57.141] do.call(function(...) { [15:31:57.141] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.141] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:57.141] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.141] on.exit(options(oopts), add = TRUE) [15:31:57.141] } [15:31:57.141] { [15:31:57.141] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:57.141] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.141] ...future.FUN(...future.X_jj, ...) [15:31:57.141] }) [15:31:57.141] } [15:31:57.141] }, args = future.call.arguments) [15:31:57.141] } [15:31:57.142] Tweak future expression to call with '...' arguments ... DONE [15:31:57.143] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.143] - packages: [1] 'listenv' [15:31:57.143] getGlobalsAndPackages() ... DONE [15:31:57.144] run() for 'Future' ... [15:31:57.144] - state: 'created' [15:31:57.145] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:57.164] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:57.165] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:57.165] - Field: 'node' [15:31:57.166] - Field: 'label' [15:31:57.166] - Field: 'local' [15:31:57.166] - Field: 'owner' [15:31:57.167] - Field: 'envir' [15:31:57.167] - Field: 'workers' [15:31:57.167] - Field: 'packages' [15:31:57.168] - Field: 'gc' [15:31:57.168] - Field: 'conditions' [15:31:57.168] - Field: 'persistent' [15:31:57.169] - Field: 'expr' [15:31:57.169] - Field: 'uuid' [15:31:57.170] - Field: 'seed' [15:31:57.170] - Field: 'version' [15:31:57.170] - Field: 'result' [15:31:57.171] - Field: 'asynchronous' [15:31:57.171] - Field: 'calls' [15:31:57.172] - Field: 'globals' [15:31:57.172] - Field: 'stdout' [15:31:57.172] - Field: 'earlySignal' [15:31:57.173] - Field: 'lazy' [15:31:57.173] - Field: 'state' [15:31:57.173] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:57.174] - Launch lazy future ... [15:31:57.175] Packages needed by the future expression (n = 1): 'listenv' [15:31:57.175] Packages needed by future strategies (n = 0): [15:31:57.176] { [15:31:57.176] { [15:31:57.176] { [15:31:57.176] ...future.startTime <- base::Sys.time() [15:31:57.176] { [15:31:57.176] { [15:31:57.176] { [15:31:57.176] { [15:31:57.176] { [15:31:57.176] base::local({ [15:31:57.176] has_future <- base::requireNamespace("future", [15:31:57.176] quietly = TRUE) [15:31:57.176] if (has_future) { [15:31:57.176] ns <- base::getNamespace("future") [15:31:57.176] version <- ns[[".package"]][["version"]] [15:31:57.176] if (is.null(version)) [15:31:57.176] version <- utils::packageVersion("future") [15:31:57.176] } [15:31:57.176] else { [15:31:57.176] version <- NULL [15:31:57.176] } [15:31:57.176] if (!has_future || version < "1.8.0") { [15:31:57.176] info <- base::c(r_version = base::gsub("R version ", [15:31:57.176] "", base::R.version$version.string), [15:31:57.176] platform = base::sprintf("%s (%s-bit)", [15:31:57.176] base::R.version$platform, 8 * [15:31:57.176] base::.Machine$sizeof.pointer), [15:31:57.176] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:57.176] "release", "version")], collapse = " "), [15:31:57.176] hostname = base::Sys.info()[["nodename"]]) [15:31:57.176] info <- base::sprintf("%s: %s", base::names(info), [15:31:57.176] info) [15:31:57.176] info <- base::paste(info, collapse = "; ") [15:31:57.176] if (!has_future) { [15:31:57.176] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:57.176] info) [15:31:57.176] } [15:31:57.176] else { [15:31:57.176] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:57.176] info, version) [15:31:57.176] } [15:31:57.176] base::stop(msg) [15:31:57.176] } [15:31:57.176] }) [15:31:57.176] } [15:31:57.176] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:57.176] base::options(mc.cores = 1L) [15:31:57.176] } [15:31:57.176] base::local({ [15:31:57.176] for (pkg in "listenv") { [15:31:57.176] base::loadNamespace(pkg) [15:31:57.176] base::library(pkg, character.only = TRUE) [15:31:57.176] } [15:31:57.176] }) [15:31:57.176] } [15:31:57.176] ...future.strategy.old <- future::plan("list") [15:31:57.176] options(future.plan = NULL) [15:31:57.176] Sys.unsetenv("R_FUTURE_PLAN") [15:31:57.176] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:57.176] } [15:31:57.176] ...future.workdir <- getwd() [15:31:57.176] } [15:31:57.176] ...future.oldOptions <- base::as.list(base::.Options) [15:31:57.176] ...future.oldEnvVars <- base::Sys.getenv() [15:31:57.176] } [15:31:57.176] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:57.176] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:57.176] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:57.176] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:57.176] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:57.176] future.stdout.windows.reencode = NULL, width = 80L) [15:31:57.176] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:57.176] base::names(...future.oldOptions)) [15:31:57.176] } [15:31:57.176] if (FALSE) { [15:31:57.176] } [15:31:57.176] else { [15:31:57.176] if (TRUE) { [15:31:57.176] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:57.176] open = "w") [15:31:57.176] } [15:31:57.176] else { [15:31:57.176] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:57.176] windows = "NUL", "/dev/null"), open = "w") [15:31:57.176] } [15:31:57.176] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:57.176] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:57.176] base::sink(type = "output", split = FALSE) [15:31:57.176] base::close(...future.stdout) [15:31:57.176] }, add = TRUE) [15:31:57.176] } [15:31:57.176] ...future.frame <- base::sys.nframe() [15:31:57.176] ...future.conditions <- base::list() [15:31:57.176] ...future.rng <- base::globalenv()$.Random.seed [15:31:57.176] if (FALSE) { [15:31:57.176] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:57.176] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:57.176] } [15:31:57.176] ...future.result <- base::tryCatch({ [15:31:57.176] base::withCallingHandlers({ [15:31:57.176] ...future.value <- base::withVisible(base::local({ [15:31:57.176] ...future.makeSendCondition <- base::local({ [15:31:57.176] sendCondition <- NULL [15:31:57.176] function(frame = 1L) { [15:31:57.176] if (is.function(sendCondition)) [15:31:57.176] return(sendCondition) [15:31:57.176] ns <- getNamespace("parallel") [15:31:57.176] if (exists("sendData", mode = "function", [15:31:57.176] envir = ns)) { [15:31:57.176] parallel_sendData <- get("sendData", mode = "function", [15:31:57.176] envir = ns) [15:31:57.176] envir <- sys.frame(frame) [15:31:57.176] master <- NULL [15:31:57.176] while (!identical(envir, .GlobalEnv) && [15:31:57.176] !identical(envir, emptyenv())) { [15:31:57.176] if (exists("master", mode = "list", envir = envir, [15:31:57.176] inherits = FALSE)) { [15:31:57.176] master <- get("master", mode = "list", [15:31:57.176] envir = envir, inherits = FALSE) [15:31:57.176] if (inherits(master, c("SOCKnode", [15:31:57.176] "SOCK0node"))) { [15:31:57.176] sendCondition <<- function(cond) { [15:31:57.176] data <- list(type = "VALUE", value = cond, [15:31:57.176] success = TRUE) [15:31:57.176] parallel_sendData(master, data) [15:31:57.176] } [15:31:57.176] return(sendCondition) [15:31:57.176] } [15:31:57.176] } [15:31:57.176] frame <- frame + 1L [15:31:57.176] envir <- sys.frame(frame) [15:31:57.176] } [15:31:57.176] } [15:31:57.176] sendCondition <<- function(cond) NULL [15:31:57.176] } [15:31:57.176] }) [15:31:57.176] withCallingHandlers({ [15:31:57.176] { [15:31:57.176] do.call(function(...) { [15:31:57.176] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.176] if (!identical(...future.globals.maxSize.org, [15:31:57.176] ...future.globals.maxSize)) { [15:31:57.176] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.176] on.exit(options(oopts), add = TRUE) [15:31:57.176] } [15:31:57.176] { [15:31:57.176] lapply(seq_along(...future.elements_ii), [15:31:57.176] FUN = function(jj) { [15:31:57.176] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.176] ...future.FUN(...future.X_jj, ...) [15:31:57.176] }) [15:31:57.176] } [15:31:57.176] }, args = future.call.arguments) [15:31:57.176] } [15:31:57.176] }, immediateCondition = function(cond) { [15:31:57.176] sendCondition <- ...future.makeSendCondition() [15:31:57.176] sendCondition(cond) [15:31:57.176] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.176] { [15:31:57.176] inherits <- base::inherits [15:31:57.176] invokeRestart <- base::invokeRestart [15:31:57.176] is.null <- base::is.null [15:31:57.176] muffled <- FALSE [15:31:57.176] if (inherits(cond, "message")) { [15:31:57.176] muffled <- grepl(pattern, "muffleMessage") [15:31:57.176] if (muffled) [15:31:57.176] invokeRestart("muffleMessage") [15:31:57.176] } [15:31:57.176] else if (inherits(cond, "warning")) { [15:31:57.176] muffled <- grepl(pattern, "muffleWarning") [15:31:57.176] if (muffled) [15:31:57.176] invokeRestart("muffleWarning") [15:31:57.176] } [15:31:57.176] else if (inherits(cond, "condition")) { [15:31:57.176] if (!is.null(pattern)) { [15:31:57.176] computeRestarts <- base::computeRestarts [15:31:57.176] grepl <- base::grepl [15:31:57.176] restarts <- computeRestarts(cond) [15:31:57.176] for (restart in restarts) { [15:31:57.176] name <- restart$name [15:31:57.176] if (is.null(name)) [15:31:57.176] next [15:31:57.176] if (!grepl(pattern, name)) [15:31:57.176] next [15:31:57.176] invokeRestart(restart) [15:31:57.176] muffled <- TRUE [15:31:57.176] break [15:31:57.176] } [15:31:57.176] } [15:31:57.176] } [15:31:57.176] invisible(muffled) [15:31:57.176] } [15:31:57.176] muffleCondition(cond) [15:31:57.176] }) [15:31:57.176] })) [15:31:57.176] future::FutureResult(value = ...future.value$value, [15:31:57.176] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:57.176] ...future.rng), globalenv = if (FALSE) [15:31:57.176] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:57.176] ...future.globalenv.names)) [15:31:57.176] else NULL, started = ...future.startTime, version = "1.8") [15:31:57.176] }, condition = base::local({ [15:31:57.176] c <- base::c [15:31:57.176] inherits <- base::inherits [15:31:57.176] invokeRestart <- base::invokeRestart [15:31:57.176] length <- base::length [15:31:57.176] list <- base::list [15:31:57.176] seq.int <- base::seq.int [15:31:57.176] signalCondition <- base::signalCondition [15:31:57.176] sys.calls <- base::sys.calls [15:31:57.176] `[[` <- base::`[[` [15:31:57.176] `+` <- base::`+` [15:31:57.176] `<<-` <- base::`<<-` [15:31:57.176] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:57.176] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:57.176] 3L)] [15:31:57.176] } [15:31:57.176] function(cond) { [15:31:57.176] is_error <- inherits(cond, "error") [15:31:57.176] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:57.176] NULL) [15:31:57.176] if (is_error) { [15:31:57.176] sessionInformation <- function() { [15:31:57.176] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:57.176] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:57.176] search = base::search(), system = base::Sys.info()) [15:31:57.176] } [15:31:57.176] ...future.conditions[[length(...future.conditions) + [15:31:57.176] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:57.176] cond$call), session = sessionInformation(), [15:31:57.176] timestamp = base::Sys.time(), signaled = 0L) [15:31:57.176] signalCondition(cond) [15:31:57.176] } [15:31:57.176] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:57.176] "immediateCondition"))) { [15:31:57.176] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:57.176] ...future.conditions[[length(...future.conditions) + [15:31:57.176] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:57.176] if (TRUE && !signal) { [15:31:57.176] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.176] { [15:31:57.176] inherits <- base::inherits [15:31:57.176] invokeRestart <- base::invokeRestart [15:31:57.176] is.null <- base::is.null [15:31:57.176] muffled <- FALSE [15:31:57.176] if (inherits(cond, "message")) { [15:31:57.176] muffled <- grepl(pattern, "muffleMessage") [15:31:57.176] if (muffled) [15:31:57.176] invokeRestart("muffleMessage") [15:31:57.176] } [15:31:57.176] else if (inherits(cond, "warning")) { [15:31:57.176] muffled <- grepl(pattern, "muffleWarning") [15:31:57.176] if (muffled) [15:31:57.176] invokeRestart("muffleWarning") [15:31:57.176] } [15:31:57.176] else if (inherits(cond, "condition")) { [15:31:57.176] if (!is.null(pattern)) { [15:31:57.176] computeRestarts <- base::computeRestarts [15:31:57.176] grepl <- base::grepl [15:31:57.176] restarts <- computeRestarts(cond) [15:31:57.176] for (restart in restarts) { [15:31:57.176] name <- restart$name [15:31:57.176] if (is.null(name)) [15:31:57.176] next [15:31:57.176] if (!grepl(pattern, name)) [15:31:57.176] next [15:31:57.176] invokeRestart(restart) [15:31:57.176] muffled <- TRUE [15:31:57.176] break [15:31:57.176] } [15:31:57.176] } [15:31:57.176] } [15:31:57.176] invisible(muffled) [15:31:57.176] } [15:31:57.176] muffleCondition(cond, pattern = "^muffle") [15:31:57.176] } [15:31:57.176] } [15:31:57.176] else { [15:31:57.176] if (TRUE) { [15:31:57.176] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.176] { [15:31:57.176] inherits <- base::inherits [15:31:57.176] invokeRestart <- base::invokeRestart [15:31:57.176] is.null <- base::is.null [15:31:57.176] muffled <- FALSE [15:31:57.176] if (inherits(cond, "message")) { [15:31:57.176] muffled <- grepl(pattern, "muffleMessage") [15:31:57.176] if (muffled) [15:31:57.176] invokeRestart("muffleMessage") [15:31:57.176] } [15:31:57.176] else if (inherits(cond, "warning")) { [15:31:57.176] muffled <- grepl(pattern, "muffleWarning") [15:31:57.176] if (muffled) [15:31:57.176] invokeRestart("muffleWarning") [15:31:57.176] } [15:31:57.176] else if (inherits(cond, "condition")) { [15:31:57.176] if (!is.null(pattern)) { [15:31:57.176] computeRestarts <- base::computeRestarts [15:31:57.176] grepl <- base::grepl [15:31:57.176] restarts <- computeRestarts(cond) [15:31:57.176] for (restart in restarts) { [15:31:57.176] name <- restart$name [15:31:57.176] if (is.null(name)) [15:31:57.176] next [15:31:57.176] if (!grepl(pattern, name)) [15:31:57.176] next [15:31:57.176] invokeRestart(restart) [15:31:57.176] muffled <- TRUE [15:31:57.176] break [15:31:57.176] } [15:31:57.176] } [15:31:57.176] } [15:31:57.176] invisible(muffled) [15:31:57.176] } [15:31:57.176] muffleCondition(cond, pattern = "^muffle") [15:31:57.176] } [15:31:57.176] } [15:31:57.176] } [15:31:57.176] })) [15:31:57.176] }, error = function(ex) { [15:31:57.176] base::structure(base::list(value = NULL, visible = NULL, [15:31:57.176] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:57.176] ...future.rng), started = ...future.startTime, [15:31:57.176] finished = Sys.time(), session_uuid = NA_character_, [15:31:57.176] version = "1.8"), class = "FutureResult") [15:31:57.176] }, finally = { [15:31:57.176] if (!identical(...future.workdir, getwd())) [15:31:57.176] setwd(...future.workdir) [15:31:57.176] { [15:31:57.176] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:57.176] ...future.oldOptions$nwarnings <- NULL [15:31:57.176] } [15:31:57.176] base::options(...future.oldOptions) [15:31:57.176] if (.Platform$OS.type == "windows") { [15:31:57.176] old_names <- names(...future.oldEnvVars) [15:31:57.176] envs <- base::Sys.getenv() [15:31:57.176] names <- names(envs) [15:31:57.176] common <- intersect(names, old_names) [15:31:57.176] added <- setdiff(names, old_names) [15:31:57.176] removed <- setdiff(old_names, names) [15:31:57.176] changed <- common[...future.oldEnvVars[common] != [15:31:57.176] envs[common]] [15:31:57.176] NAMES <- toupper(changed) [15:31:57.176] args <- list() [15:31:57.176] for (kk in seq_along(NAMES)) { [15:31:57.176] name <- changed[[kk]] [15:31:57.176] NAME <- NAMES[[kk]] [15:31:57.176] if (name != NAME && is.element(NAME, old_names)) [15:31:57.176] next [15:31:57.176] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:57.176] } [15:31:57.176] NAMES <- toupper(added) [15:31:57.176] for (kk in seq_along(NAMES)) { [15:31:57.176] name <- added[[kk]] [15:31:57.176] NAME <- NAMES[[kk]] [15:31:57.176] if (name != NAME && is.element(NAME, old_names)) [15:31:57.176] next [15:31:57.176] args[[name]] <- "" [15:31:57.176] } [15:31:57.176] NAMES <- toupper(removed) [15:31:57.176] for (kk in seq_along(NAMES)) { [15:31:57.176] name <- removed[[kk]] [15:31:57.176] NAME <- NAMES[[kk]] [15:31:57.176] if (name != NAME && is.element(NAME, old_names)) [15:31:57.176] next [15:31:57.176] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:57.176] } [15:31:57.176] if (length(args) > 0) [15:31:57.176] base::do.call(base::Sys.setenv, args = args) [15:31:57.176] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:57.176] } [15:31:57.176] else { [15:31:57.176] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:57.176] } [15:31:57.176] { [15:31:57.176] if (base::length(...future.futureOptionsAdded) > [15:31:57.176] 0L) { [15:31:57.176] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:57.176] base::names(opts) <- ...future.futureOptionsAdded [15:31:57.176] base::options(opts) [15:31:57.176] } [15:31:57.176] { [15:31:57.176] { [15:31:57.176] base::options(mc.cores = ...future.mc.cores.old) [15:31:57.176] NULL [15:31:57.176] } [15:31:57.176] options(future.plan = NULL) [15:31:57.176] if (is.na(NA_character_)) [15:31:57.176] Sys.unsetenv("R_FUTURE_PLAN") [15:31:57.176] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:57.176] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:57.176] .init = FALSE) [15:31:57.176] } [15:31:57.176] } [15:31:57.176] } [15:31:57.176] }) [15:31:57.176] if (TRUE) { [15:31:57.176] base::sink(type = "output", split = FALSE) [15:31:57.176] if (TRUE) { [15:31:57.176] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:57.176] } [15:31:57.176] else { [15:31:57.176] ...future.result["stdout"] <- base::list(NULL) [15:31:57.176] } [15:31:57.176] base::close(...future.stdout) [15:31:57.176] ...future.stdout <- NULL [15:31:57.176] } [15:31:57.176] ...future.result$conditions <- ...future.conditions [15:31:57.176] ...future.result$finished <- base::Sys.time() [15:31:57.176] ...future.result [15:31:57.176] } [15:31:57.185] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... [15:31:57.186] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... [15:31:57.187] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... DONE [15:31:57.187] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [15:31:57.188] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [15:31:57.189] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [15:31:57.190] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [15:31:57.191] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:57.191] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:57.192] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:57.192] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:57.193] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... DONE [15:31:57.194] MultisessionFuture started [15:31:57.194] - Launch lazy future ... done [15:31:57.194] run() for 'MultisessionFuture' ... done [15:31:57.195] Created future: [15:31:57.231] receiveMessageFromWorker() for ClusterFuture ... [15:31:57.231] - Validating connection of MultisessionFuture [15:31:57.232] - received message: FutureResult [15:31:57.232] - Received FutureResult [15:31:57.233] - Erased future from FutureRegistry [15:31:57.233] result() for ClusterFuture ... [15:31:57.233] - result already collected: FutureResult [15:31:57.234] result() for ClusterFuture ... done [15:31:57.234] receiveMessageFromWorker() for ClusterFuture ... done [15:31:57.195] MultisessionFuture: [15:31:57.195] Label: 'future_lapply-1' [15:31:57.195] Expression: [15:31:57.195] { [15:31:57.195] do.call(function(...) { [15:31:57.195] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.195] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:57.195] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.195] on.exit(options(oopts), add = TRUE) [15:31:57.195] } [15:31:57.195] { [15:31:57.195] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:57.195] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.195] ...future.FUN(...future.X_jj, ...) [15:31:57.195] }) [15:31:57.195] } [15:31:57.195] }, args = future.call.arguments) [15:31:57.195] } [15:31:57.195] Lazy evaluation: FALSE [15:31:57.195] Asynchronous evaluation: TRUE [15:31:57.195] Local evaluation: TRUE [15:31:57.195] Environment: R_GlobalEnv [15:31:57.195] Capture standard output: TRUE [15:31:57.195] Capture condition classes: 'condition' (excluding 'nothing') [15:31:57.195] Globals: 5 objects totaling 4.96 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:57.195] Packages: 1 packages ('listenv') [15:31:57.195] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:57.195] Resolved: TRUE [15:31:57.195] Value: [15:31:57.195] Conditions captured: [15:31:57.195] Early signaling: FALSE [15:31:57.195] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:57.195] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:57.235] Chunk #1 of 2 ... DONE [15:31:57.235] Chunk #2 of 2 ... [15:31:57.236] - Finding globals in 'X' for chunk #2 ... [15:31:57.236] getGlobalsAndPackages() ... [15:31:57.236] Searching for globals... [15:31:57.237] [15:31:57.238] Searching for globals ... DONE [15:31:57.238] - globals: [0] [15:31:57.238] getGlobalsAndPackages() ... DONE [15:31:57.238] + additional globals found: [n=0] [15:31:57.239] + additional namespaces needed: [n=0] [15:31:57.239] - Finding globals in 'X' for chunk #2 ... DONE [15:31:57.239] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:57.239] - seeds: [15:31:57.240] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.240] getGlobalsAndPackages() ... [15:31:57.240] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.241] Resolving globals: FALSE [15:31:57.241] Tweak future expression to call with '...' arguments ... [15:31:57.241] { [15:31:57.241] do.call(function(...) { [15:31:57.241] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.241] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:57.241] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.241] on.exit(options(oopts), add = TRUE) [15:31:57.241] } [15:31:57.241] { [15:31:57.241] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:57.241] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.241] ...future.FUN(...future.X_jj, ...) [15:31:57.241] }) [15:31:57.241] } [15:31:57.241] }, args = future.call.arguments) [15:31:57.241] } [15:31:57.242] Tweak future expression to call with '...' arguments ... DONE [15:31:57.243] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.244] - packages: [1] 'listenv' [15:31:57.244] getGlobalsAndPackages() ... DONE [15:31:57.245] run() for 'Future' ... [15:31:57.245] - state: 'created' [15:31:57.245] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:57.264] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:57.265] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:57.265] - Field: 'node' [15:31:57.266] - Field: 'label' [15:31:57.266] - Field: 'local' [15:31:57.266] - Field: 'owner' [15:31:57.267] - Field: 'envir' [15:31:57.267] - Field: 'workers' [15:31:57.267] - Field: 'packages' [15:31:57.268] - Field: 'gc' [15:31:57.268] - Field: 'conditions' [15:31:57.268] - Field: 'persistent' [15:31:57.269] - Field: 'expr' [15:31:57.269] - Field: 'uuid' [15:31:57.269] - Field: 'seed' [15:31:57.270] - Field: 'version' [15:31:57.270] - Field: 'result' [15:31:57.270] - Field: 'asynchronous' [15:31:57.271] - Field: 'calls' [15:31:57.271] - Field: 'globals' [15:31:57.271] - Field: 'stdout' [15:31:57.271] - Field: 'earlySignal' [15:31:57.272] - Field: 'lazy' [15:31:57.272] - Field: 'state' [15:31:57.272] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:57.273] - Launch lazy future ... [15:31:57.274] Packages needed by the future expression (n = 1): 'listenv' [15:31:57.274] Packages needed by future strategies (n = 0): [15:31:57.275] { [15:31:57.275] { [15:31:57.275] { [15:31:57.275] ...future.startTime <- base::Sys.time() [15:31:57.275] { [15:31:57.275] { [15:31:57.275] { [15:31:57.275] { [15:31:57.275] { [15:31:57.275] base::local({ [15:31:57.275] has_future <- base::requireNamespace("future", [15:31:57.275] quietly = TRUE) [15:31:57.275] if (has_future) { [15:31:57.275] ns <- base::getNamespace("future") [15:31:57.275] version <- ns[[".package"]][["version"]] [15:31:57.275] if (is.null(version)) [15:31:57.275] version <- utils::packageVersion("future") [15:31:57.275] } [15:31:57.275] else { [15:31:57.275] version <- NULL [15:31:57.275] } [15:31:57.275] if (!has_future || version < "1.8.0") { [15:31:57.275] info <- base::c(r_version = base::gsub("R version ", [15:31:57.275] "", base::R.version$version.string), [15:31:57.275] platform = base::sprintf("%s (%s-bit)", [15:31:57.275] base::R.version$platform, 8 * [15:31:57.275] base::.Machine$sizeof.pointer), [15:31:57.275] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:57.275] "release", "version")], collapse = " "), [15:31:57.275] hostname = base::Sys.info()[["nodename"]]) [15:31:57.275] info <- base::sprintf("%s: %s", base::names(info), [15:31:57.275] info) [15:31:57.275] info <- base::paste(info, collapse = "; ") [15:31:57.275] if (!has_future) { [15:31:57.275] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:57.275] info) [15:31:57.275] } [15:31:57.275] else { [15:31:57.275] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:57.275] info, version) [15:31:57.275] } [15:31:57.275] base::stop(msg) [15:31:57.275] } [15:31:57.275] }) [15:31:57.275] } [15:31:57.275] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:57.275] base::options(mc.cores = 1L) [15:31:57.275] } [15:31:57.275] base::local({ [15:31:57.275] for (pkg in "listenv") { [15:31:57.275] base::loadNamespace(pkg) [15:31:57.275] base::library(pkg, character.only = TRUE) [15:31:57.275] } [15:31:57.275] }) [15:31:57.275] } [15:31:57.275] ...future.strategy.old <- future::plan("list") [15:31:57.275] options(future.plan = NULL) [15:31:57.275] Sys.unsetenv("R_FUTURE_PLAN") [15:31:57.275] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:57.275] } [15:31:57.275] ...future.workdir <- getwd() [15:31:57.275] } [15:31:57.275] ...future.oldOptions <- base::as.list(base::.Options) [15:31:57.275] ...future.oldEnvVars <- base::Sys.getenv() [15:31:57.275] } [15:31:57.275] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:57.275] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:57.275] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:57.275] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:57.275] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:57.275] future.stdout.windows.reencode = NULL, width = 80L) [15:31:57.275] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:57.275] base::names(...future.oldOptions)) [15:31:57.275] } [15:31:57.275] if (FALSE) { [15:31:57.275] } [15:31:57.275] else { [15:31:57.275] if (TRUE) { [15:31:57.275] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:57.275] open = "w") [15:31:57.275] } [15:31:57.275] else { [15:31:57.275] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:57.275] windows = "NUL", "/dev/null"), open = "w") [15:31:57.275] } [15:31:57.275] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:57.275] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:57.275] base::sink(type = "output", split = FALSE) [15:31:57.275] base::close(...future.stdout) [15:31:57.275] }, add = TRUE) [15:31:57.275] } [15:31:57.275] ...future.frame <- base::sys.nframe() [15:31:57.275] ...future.conditions <- base::list() [15:31:57.275] ...future.rng <- base::globalenv()$.Random.seed [15:31:57.275] if (FALSE) { [15:31:57.275] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:57.275] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:57.275] } [15:31:57.275] ...future.result <- base::tryCatch({ [15:31:57.275] base::withCallingHandlers({ [15:31:57.275] ...future.value <- base::withVisible(base::local({ [15:31:57.275] ...future.makeSendCondition <- base::local({ [15:31:57.275] sendCondition <- NULL [15:31:57.275] function(frame = 1L) { [15:31:57.275] if (is.function(sendCondition)) [15:31:57.275] return(sendCondition) [15:31:57.275] ns <- getNamespace("parallel") [15:31:57.275] if (exists("sendData", mode = "function", [15:31:57.275] envir = ns)) { [15:31:57.275] parallel_sendData <- get("sendData", mode = "function", [15:31:57.275] envir = ns) [15:31:57.275] envir <- sys.frame(frame) [15:31:57.275] master <- NULL [15:31:57.275] while (!identical(envir, .GlobalEnv) && [15:31:57.275] !identical(envir, emptyenv())) { [15:31:57.275] if (exists("master", mode = "list", envir = envir, [15:31:57.275] inherits = FALSE)) { [15:31:57.275] master <- get("master", mode = "list", [15:31:57.275] envir = envir, inherits = FALSE) [15:31:57.275] if (inherits(master, c("SOCKnode", [15:31:57.275] "SOCK0node"))) { [15:31:57.275] sendCondition <<- function(cond) { [15:31:57.275] data <- list(type = "VALUE", value = cond, [15:31:57.275] success = TRUE) [15:31:57.275] parallel_sendData(master, data) [15:31:57.275] } [15:31:57.275] return(sendCondition) [15:31:57.275] } [15:31:57.275] } [15:31:57.275] frame <- frame + 1L [15:31:57.275] envir <- sys.frame(frame) [15:31:57.275] } [15:31:57.275] } [15:31:57.275] sendCondition <<- function(cond) NULL [15:31:57.275] } [15:31:57.275] }) [15:31:57.275] withCallingHandlers({ [15:31:57.275] { [15:31:57.275] do.call(function(...) { [15:31:57.275] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.275] if (!identical(...future.globals.maxSize.org, [15:31:57.275] ...future.globals.maxSize)) { [15:31:57.275] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.275] on.exit(options(oopts), add = TRUE) [15:31:57.275] } [15:31:57.275] { [15:31:57.275] lapply(seq_along(...future.elements_ii), [15:31:57.275] FUN = function(jj) { [15:31:57.275] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.275] ...future.FUN(...future.X_jj, ...) [15:31:57.275] }) [15:31:57.275] } [15:31:57.275] }, args = future.call.arguments) [15:31:57.275] } [15:31:57.275] }, immediateCondition = function(cond) { [15:31:57.275] sendCondition <- ...future.makeSendCondition() [15:31:57.275] sendCondition(cond) [15:31:57.275] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.275] { [15:31:57.275] inherits <- base::inherits [15:31:57.275] invokeRestart <- base::invokeRestart [15:31:57.275] is.null <- base::is.null [15:31:57.275] muffled <- FALSE [15:31:57.275] if (inherits(cond, "message")) { [15:31:57.275] muffled <- grepl(pattern, "muffleMessage") [15:31:57.275] if (muffled) [15:31:57.275] invokeRestart("muffleMessage") [15:31:57.275] } [15:31:57.275] else if (inherits(cond, "warning")) { [15:31:57.275] muffled <- grepl(pattern, "muffleWarning") [15:31:57.275] if (muffled) [15:31:57.275] invokeRestart("muffleWarning") [15:31:57.275] } [15:31:57.275] else if (inherits(cond, "condition")) { [15:31:57.275] if (!is.null(pattern)) { [15:31:57.275] computeRestarts <- base::computeRestarts [15:31:57.275] grepl <- base::grepl [15:31:57.275] restarts <- computeRestarts(cond) [15:31:57.275] for (restart in restarts) { [15:31:57.275] name <- restart$name [15:31:57.275] if (is.null(name)) [15:31:57.275] next [15:31:57.275] if (!grepl(pattern, name)) [15:31:57.275] next [15:31:57.275] invokeRestart(restart) [15:31:57.275] muffled <- TRUE [15:31:57.275] break [15:31:57.275] } [15:31:57.275] } [15:31:57.275] } [15:31:57.275] invisible(muffled) [15:31:57.275] } [15:31:57.275] muffleCondition(cond) [15:31:57.275] }) [15:31:57.275] })) [15:31:57.275] future::FutureResult(value = ...future.value$value, [15:31:57.275] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:57.275] ...future.rng), globalenv = if (FALSE) [15:31:57.275] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:57.275] ...future.globalenv.names)) [15:31:57.275] else NULL, started = ...future.startTime, version = "1.8") [15:31:57.275] }, condition = base::local({ [15:31:57.275] c <- base::c [15:31:57.275] inherits <- base::inherits [15:31:57.275] invokeRestart <- base::invokeRestart [15:31:57.275] length <- base::length [15:31:57.275] list <- base::list [15:31:57.275] seq.int <- base::seq.int [15:31:57.275] signalCondition <- base::signalCondition [15:31:57.275] sys.calls <- base::sys.calls [15:31:57.275] `[[` <- base::`[[` [15:31:57.275] `+` <- base::`+` [15:31:57.275] `<<-` <- base::`<<-` [15:31:57.275] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:57.275] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:57.275] 3L)] [15:31:57.275] } [15:31:57.275] function(cond) { [15:31:57.275] is_error <- inherits(cond, "error") [15:31:57.275] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:57.275] NULL) [15:31:57.275] if (is_error) { [15:31:57.275] sessionInformation <- function() { [15:31:57.275] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:57.275] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:57.275] search = base::search(), system = base::Sys.info()) [15:31:57.275] } [15:31:57.275] ...future.conditions[[length(...future.conditions) + [15:31:57.275] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:57.275] cond$call), session = sessionInformation(), [15:31:57.275] timestamp = base::Sys.time(), signaled = 0L) [15:31:57.275] signalCondition(cond) [15:31:57.275] } [15:31:57.275] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:57.275] "immediateCondition"))) { [15:31:57.275] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:57.275] ...future.conditions[[length(...future.conditions) + [15:31:57.275] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:57.275] if (TRUE && !signal) { [15:31:57.275] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.275] { [15:31:57.275] inherits <- base::inherits [15:31:57.275] invokeRestart <- base::invokeRestart [15:31:57.275] is.null <- base::is.null [15:31:57.275] muffled <- FALSE [15:31:57.275] if (inherits(cond, "message")) { [15:31:57.275] muffled <- grepl(pattern, "muffleMessage") [15:31:57.275] if (muffled) [15:31:57.275] invokeRestart("muffleMessage") [15:31:57.275] } [15:31:57.275] else if (inherits(cond, "warning")) { [15:31:57.275] muffled <- grepl(pattern, "muffleWarning") [15:31:57.275] if (muffled) [15:31:57.275] invokeRestart("muffleWarning") [15:31:57.275] } [15:31:57.275] else if (inherits(cond, "condition")) { [15:31:57.275] if (!is.null(pattern)) { [15:31:57.275] computeRestarts <- base::computeRestarts [15:31:57.275] grepl <- base::grepl [15:31:57.275] restarts <- computeRestarts(cond) [15:31:57.275] for (restart in restarts) { [15:31:57.275] name <- restart$name [15:31:57.275] if (is.null(name)) [15:31:57.275] next [15:31:57.275] if (!grepl(pattern, name)) [15:31:57.275] next [15:31:57.275] invokeRestart(restart) [15:31:57.275] muffled <- TRUE [15:31:57.275] break [15:31:57.275] } [15:31:57.275] } [15:31:57.275] } [15:31:57.275] invisible(muffled) [15:31:57.275] } [15:31:57.275] muffleCondition(cond, pattern = "^muffle") [15:31:57.275] } [15:31:57.275] } [15:31:57.275] else { [15:31:57.275] if (TRUE) { [15:31:57.275] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.275] { [15:31:57.275] inherits <- base::inherits [15:31:57.275] invokeRestart <- base::invokeRestart [15:31:57.275] is.null <- base::is.null [15:31:57.275] muffled <- FALSE [15:31:57.275] if (inherits(cond, "message")) { [15:31:57.275] muffled <- grepl(pattern, "muffleMessage") [15:31:57.275] if (muffled) [15:31:57.275] invokeRestart("muffleMessage") [15:31:57.275] } [15:31:57.275] else if (inherits(cond, "warning")) { [15:31:57.275] muffled <- grepl(pattern, "muffleWarning") [15:31:57.275] if (muffled) [15:31:57.275] invokeRestart("muffleWarning") [15:31:57.275] } [15:31:57.275] else if (inherits(cond, "condition")) { [15:31:57.275] if (!is.null(pattern)) { [15:31:57.275] computeRestarts <- base::computeRestarts [15:31:57.275] grepl <- base::grepl [15:31:57.275] restarts <- computeRestarts(cond) [15:31:57.275] for (restart in restarts) { [15:31:57.275] name <- restart$name [15:31:57.275] if (is.null(name)) [15:31:57.275] next [15:31:57.275] if (!grepl(pattern, name)) [15:31:57.275] next [15:31:57.275] invokeRestart(restart) [15:31:57.275] muffled <- TRUE [15:31:57.275] break [15:31:57.275] } [15:31:57.275] } [15:31:57.275] } [15:31:57.275] invisible(muffled) [15:31:57.275] } [15:31:57.275] muffleCondition(cond, pattern = "^muffle") [15:31:57.275] } [15:31:57.275] } [15:31:57.275] } [15:31:57.275] })) [15:31:57.275] }, error = function(ex) { [15:31:57.275] base::structure(base::list(value = NULL, visible = NULL, [15:31:57.275] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:57.275] ...future.rng), started = ...future.startTime, [15:31:57.275] finished = Sys.time(), session_uuid = NA_character_, [15:31:57.275] version = "1.8"), class = "FutureResult") [15:31:57.275] }, finally = { [15:31:57.275] if (!identical(...future.workdir, getwd())) [15:31:57.275] setwd(...future.workdir) [15:31:57.275] { [15:31:57.275] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:57.275] ...future.oldOptions$nwarnings <- NULL [15:31:57.275] } [15:31:57.275] base::options(...future.oldOptions) [15:31:57.275] if (.Platform$OS.type == "windows") { [15:31:57.275] old_names <- names(...future.oldEnvVars) [15:31:57.275] envs <- base::Sys.getenv() [15:31:57.275] names <- names(envs) [15:31:57.275] common <- intersect(names, old_names) [15:31:57.275] added <- setdiff(names, old_names) [15:31:57.275] removed <- setdiff(old_names, names) [15:31:57.275] changed <- common[...future.oldEnvVars[common] != [15:31:57.275] envs[common]] [15:31:57.275] NAMES <- toupper(changed) [15:31:57.275] args <- list() [15:31:57.275] for (kk in seq_along(NAMES)) { [15:31:57.275] name <- changed[[kk]] [15:31:57.275] NAME <- NAMES[[kk]] [15:31:57.275] if (name != NAME && is.element(NAME, old_names)) [15:31:57.275] next [15:31:57.275] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:57.275] } [15:31:57.275] NAMES <- toupper(added) [15:31:57.275] for (kk in seq_along(NAMES)) { [15:31:57.275] name <- added[[kk]] [15:31:57.275] NAME <- NAMES[[kk]] [15:31:57.275] if (name != NAME && is.element(NAME, old_names)) [15:31:57.275] next [15:31:57.275] args[[name]] <- "" [15:31:57.275] } [15:31:57.275] NAMES <- toupper(removed) [15:31:57.275] for (kk in seq_along(NAMES)) { [15:31:57.275] name <- removed[[kk]] [15:31:57.275] NAME <- NAMES[[kk]] [15:31:57.275] if (name != NAME && is.element(NAME, old_names)) [15:31:57.275] next [15:31:57.275] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:57.275] } [15:31:57.275] if (length(args) > 0) [15:31:57.275] base::do.call(base::Sys.setenv, args = args) [15:31:57.275] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:57.275] } [15:31:57.275] else { [15:31:57.275] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:57.275] } [15:31:57.275] { [15:31:57.275] if (base::length(...future.futureOptionsAdded) > [15:31:57.275] 0L) { [15:31:57.275] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:57.275] base::names(opts) <- ...future.futureOptionsAdded [15:31:57.275] base::options(opts) [15:31:57.275] } [15:31:57.275] { [15:31:57.275] { [15:31:57.275] base::options(mc.cores = ...future.mc.cores.old) [15:31:57.275] NULL [15:31:57.275] } [15:31:57.275] options(future.plan = NULL) [15:31:57.275] if (is.na(NA_character_)) [15:31:57.275] Sys.unsetenv("R_FUTURE_PLAN") [15:31:57.275] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:57.275] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:57.275] .init = FALSE) [15:31:57.275] } [15:31:57.275] } [15:31:57.275] } [15:31:57.275] }) [15:31:57.275] if (TRUE) { [15:31:57.275] base::sink(type = "output", split = FALSE) [15:31:57.275] if (TRUE) { [15:31:57.275] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:57.275] } [15:31:57.275] else { [15:31:57.275] ...future.result["stdout"] <- base::list(NULL) [15:31:57.275] } [15:31:57.275] base::close(...future.stdout) [15:31:57.275] ...future.stdout <- NULL [15:31:57.275] } [15:31:57.275] ...future.result$conditions <- ...future.conditions [15:31:57.275] ...future.result$finished <- base::Sys.time() [15:31:57.275] ...future.result [15:31:57.275] } [15:31:57.285] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... [15:31:57.286] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... [15:31:57.287] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... DONE [15:31:57.288] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [15:31:57.288] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [15:31:57.289] Exporting '...future.elements_ii' (12.94 KiB) to cluster node #1 ... [15:31:57.290] Exporting '...future.elements_ii' (12.94 KiB) to cluster node #1 ... DONE [15:31:57.290] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:57.290] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:57.291] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:57.291] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:57.292] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... DONE [15:31:57.293] MultisessionFuture started [15:31:57.293] - Launch lazy future ... done [15:31:57.293] run() for 'MultisessionFuture' ... done [15:31:57.294] Created future: [15:31:57.323] receiveMessageFromWorker() for ClusterFuture ... [15:31:57.323] - Validating connection of MultisessionFuture [15:31:57.324] - received message: FutureResult [15:31:57.324] - Received FutureResult [15:31:57.324] - Erased future from FutureRegistry [15:31:57.325] result() for ClusterFuture ... [15:31:57.325] - result already collected: FutureResult [15:31:57.325] result() for ClusterFuture ... done [15:31:57.325] receiveMessageFromWorker() for ClusterFuture ... done [15:31:57.294] MultisessionFuture: [15:31:57.294] Label: 'future_lapply-2' [15:31:57.294] Expression: [15:31:57.294] { [15:31:57.294] do.call(function(...) { [15:31:57.294] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.294] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:57.294] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.294] on.exit(options(oopts), add = TRUE) [15:31:57.294] } [15:31:57.294] { [15:31:57.294] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:57.294] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.294] ...future.FUN(...future.X_jj, ...) [15:31:57.294] }) [15:31:57.294] } [15:31:57.294] }, args = future.call.arguments) [15:31:57.294] } [15:31:57.294] Lazy evaluation: FALSE [15:31:57.294] Asynchronous evaluation: TRUE [15:31:57.294] Local evaluation: TRUE [15:31:57.294] Environment: R_GlobalEnv [15:31:57.294] Capture standard output: TRUE [15:31:57.294] Capture condition classes: 'condition' (excluding 'nothing') [15:31:57.294] Globals: 5 objects totaling 17.79 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 12.94 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:57.294] Packages: 1 packages ('listenv') [15:31:57.294] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:57.294] Resolved: TRUE [15:31:57.294] Value: [15:31:57.294] Conditions captured: [15:31:57.294] Early signaling: FALSE [15:31:57.294] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:57.294] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:57.326] Chunk #2 of 2 ... DONE [15:31:57.327] Launching 2 futures (chunks) ... DONE [15:31:57.327] Resolving 2 futures (chunks) ... [15:31:57.327] resolve() on list ... [15:31:57.328] recursive: 0 [15:31:57.328] length: 2 [15:31:57.328] [15:31:57.328] Future #1 [15:31:57.329] result() for ClusterFuture ... [15:31:57.329] - result already collected: FutureResult [15:31:57.329] result() for ClusterFuture ... done [15:31:57.330] result() for ClusterFuture ... [15:31:57.330] - result already collected: FutureResult [15:31:57.330] result() for ClusterFuture ... done [15:31:57.330] signalConditionsASAP(MultisessionFuture, pos=1) ... [15:31:57.331] - nx: 2 [15:31:57.331] - relay: TRUE [15:31:57.331] - stdout: TRUE [15:31:57.332] - signal: TRUE [15:31:57.332] - resignal: FALSE [15:31:57.332] - force: TRUE [15:31:57.332] - relayed: [n=2] FALSE, FALSE [15:31:57.333] - queued futures: [n=2] FALSE, FALSE [15:31:57.333] - until=1 [15:31:57.333] - relaying element #1 [15:31:57.333] result() for ClusterFuture ... [15:31:57.334] - result already collected: FutureResult [15:31:57.334] result() for ClusterFuture ... done [15:31:57.334] result() for ClusterFuture ... [15:31:57.335] - result already collected: FutureResult [15:31:57.335] result() for ClusterFuture ... done [15:31:57.335] result() for ClusterFuture ... [15:31:57.336] - result already collected: FutureResult [15:31:57.336] result() for ClusterFuture ... done [15:31:57.336] result() for ClusterFuture ... [15:31:57.336] - result already collected: FutureResult [15:31:57.337] result() for ClusterFuture ... done [15:31:57.337] - relayed: [n=2] TRUE, FALSE [15:31:57.337] - queued futures: [n=2] TRUE, FALSE [15:31:57.338] signalConditionsASAP(MultisessionFuture, pos=1) ... done [15:31:57.338] length: 1 (resolved future 1) [15:31:57.338] Future #2 [15:31:57.339] result() for ClusterFuture ... [15:31:57.339] - result already collected: FutureResult [15:31:57.339] result() for ClusterFuture ... done [15:31:57.339] result() for ClusterFuture ... [15:31:57.340] - result already collected: FutureResult [15:31:57.340] result() for ClusterFuture ... done [15:31:57.340] signalConditionsASAP(MultisessionFuture, pos=2) ... [15:31:57.341] - nx: 2 [15:31:57.341] - relay: TRUE [15:31:57.341] - stdout: TRUE [15:31:57.341] - signal: TRUE [15:31:57.342] - resignal: FALSE [15:31:57.342] - force: TRUE [15:31:57.342] - relayed: [n=2] TRUE, FALSE [15:31:57.342] - queued futures: [n=2] TRUE, FALSE [15:31:57.343] - until=2 [15:31:57.343] - relaying element #2 [15:31:57.343] result() for ClusterFuture ... [15:31:57.343] - result already collected: FutureResult [15:31:57.344] result() for ClusterFuture ... done [15:31:57.344] result() for ClusterFuture ... [15:31:57.344] - result already collected: FutureResult [15:31:57.344] result() for ClusterFuture ... done [15:31:57.345] result() for ClusterFuture ... [15:31:57.345] - result already collected: FutureResult [15:31:57.345] result() for ClusterFuture ... done [15:31:57.346] result() for ClusterFuture ... [15:31:57.346] - result already collected: FutureResult [15:31:57.346] result() for ClusterFuture ... done [15:31:57.346] - relayed: [n=2] TRUE, TRUE [15:31:57.347] - queued futures: [n=2] TRUE, TRUE [15:31:57.347] signalConditionsASAP(MultisessionFuture, pos=2) ... done [15:31:57.347] length: 0 (resolved future 2) [15:31:57.348] Relaying remaining futures [15:31:57.348] signalConditionsASAP(NULL, pos=0) ... [15:31:57.348] - nx: 2 [15:31:57.348] - relay: TRUE [15:31:57.349] - stdout: TRUE [15:31:57.349] - signal: TRUE [15:31:57.349] - resignal: FALSE [15:31:57.349] - force: TRUE [15:31:57.350] - relayed: [n=2] TRUE, TRUE [15:31:57.350] - queued futures: [n=2] TRUE, TRUE - flush all [15:31:57.350] - relayed: [n=2] TRUE, TRUE [15:31:57.350] - queued futures: [n=2] TRUE, TRUE [15:31:57.351] signalConditionsASAP(NULL, pos=0) ... done [15:31:57.351] resolve() on list ... DONE [15:31:57.351] result() for ClusterFuture ... [15:31:57.351] - result already collected: FutureResult [15:31:57.352] result() for ClusterFuture ... done [15:31:57.352] result() for ClusterFuture ... [15:31:57.352] - result already collected: FutureResult [15:31:57.352] result() for ClusterFuture ... done [15:31:57.353] result() for ClusterFuture ... [15:31:57.353] - result already collected: FutureResult [15:31:57.353] result() for ClusterFuture ... done [15:31:57.353] result() for ClusterFuture ... [15:31:57.354] - result already collected: FutureResult [15:31:57.354] result() for ClusterFuture ... done [15:31:57.354] - Number of value chunks collected: 2 [15:31:57.355] Resolving 2 futures (chunks) ... DONE [15:31:57.355] Reducing values from 2 chunks ... [15:31:57.355] - Number of values collected after concatenation: 2 [15:31:57.355] - Number of values expected: 2 [15:31:57.356] Reducing values from 2 chunks ... DONE [15:31:57.356] 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, ...) ... [15:31:57.359] future_lapply() ... [15:31:57.364] Number of chunks: 2 [15:31:57.364] getGlobalsAndPackagesXApply() ... [15:31:57.365] - future.globals: TRUE [15:31:57.365] getGlobalsAndPackages() ... [15:31:57.365] Searching for globals... [15:31:57.368] - globals found: [2] 'FUN', '.Internal' [15:31:57.368] Searching for globals ... DONE [15:31:57.368] Resolving globals: FALSE [15:31:57.369] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:57.370] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:57.370] - globals: [1] 'FUN' [15:31:57.370] [15:31:57.370] getGlobalsAndPackages() ... DONE [15:31:57.371] - globals found/used: [n=1] 'FUN' [15:31:57.371] - needed namespaces: [n=0] [15:31:57.371] Finding globals ... DONE [15:31:57.372] - use_args: TRUE [15:31:57.372] - Getting '...' globals ... [15:31:57.373] resolve() on list ... [15:31:57.373] recursive: 0 [15:31:57.373] length: 1 [15:31:57.373] elements: '...' [15:31:57.374] length: 0 (resolved future 1) [15:31:57.374] resolve() on list ... DONE [15:31:57.374] - '...' content: [n=1] 'length' [15:31:57.374] List of 1 [15:31:57.374] $ ...:List of 1 [15:31:57.374] ..$ length: int 2 [15:31:57.374] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:57.374] - attr(*, "where")=List of 1 [15:31:57.374] ..$ ...: [15:31:57.374] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:57.374] - attr(*, "resolved")= logi TRUE [15:31:57.374] - attr(*, "total_size")= num NA [15:31:57.380] - Getting '...' globals ... DONE [15:31:57.380] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:57.381] List of 2 [15:31:57.381] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:57.381] $ ... :List of 1 [15:31:57.381] ..$ length: int 2 [15:31:57.381] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:57.381] - attr(*, "where")=List of 2 [15:31:57.381] ..$ ...future.FUN: [15:31:57.381] ..$ ... : [15:31:57.381] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:57.381] - attr(*, "resolved")= logi FALSE [15:31:57.381] - attr(*, "total_size")= num 2240 [15:31:57.386] Packages to be attached in all futures: [n=0] [15:31:57.387] getGlobalsAndPackagesXApply() ... DONE [15:31:57.387] Number of futures (= number of chunks): 2 [15:31:57.387] Launching 2 futures (chunks) ... [15:31:57.388] Chunk #1 of 2 ... [15:31:57.388] - Finding globals in 'X' for chunk #1 ... [15:31:57.388] getGlobalsAndPackages() ... [15:31:57.389] Searching for globals... [15:31:57.389] [15:31:57.389] Searching for globals ... DONE [15:31:57.390] - globals: [0] [15:31:57.390] getGlobalsAndPackages() ... DONE [15:31:57.390] + additional globals found: [n=0] [15:31:57.390] + additional namespaces needed: [n=0] [15:31:57.391] - Finding globals in 'X' for chunk #1 ... DONE [15:31:57.391] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:57.391] - seeds: [15:31:57.391] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.392] getGlobalsAndPackages() ... [15:31:57.392] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.392] Resolving globals: FALSE [15:31:57.393] Tweak future expression to call with '...' arguments ... [15:31:57.393] { [15:31:57.393] do.call(function(...) { [15:31:57.393] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.393] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:57.393] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.393] on.exit(options(oopts), add = TRUE) [15:31:57.393] } [15:31:57.393] { [15:31:57.393] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:57.393] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.393] ...future.FUN(...future.X_jj, ...) [15:31:57.393] }) [15:31:57.393] } [15:31:57.393] }, args = future.call.arguments) [15:31:57.393] } [15:31:57.394] Tweak future expression to call with '...' arguments ... DONE [15:31:57.394] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.395] [15:31:57.395] getGlobalsAndPackages() ... DONE [15:31:57.396] run() for 'Future' ... [15:31:57.396] - state: 'created' [15:31:57.396] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:57.414] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:57.414] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:57.414] - Field: 'node' [15:31:57.415] - Field: 'label' [15:31:57.415] - Field: 'local' [15:31:57.415] - Field: 'owner' [15:31:57.416] - Field: 'envir' [15:31:57.416] - Field: 'workers' [15:31:57.416] - Field: 'packages' [15:31:57.417] - Field: 'gc' [15:31:57.417] - Field: 'conditions' [15:31:57.417] - Field: 'persistent' [15:31:57.417] - Field: 'expr' [15:31:57.418] - Field: 'uuid' [15:31:57.418] - Field: 'seed' [15:31:57.418] - Field: 'version' [15:31:57.418] - Field: 'result' [15:31:57.419] - Field: 'asynchronous' [15:31:57.419] - Field: 'calls' [15:31:57.419] - Field: 'globals' [15:31:57.419] - Field: 'stdout' [15:31:57.420] - Field: 'earlySignal' [15:31:57.420] - Field: 'lazy' [15:31:57.420] - Field: 'state' [15:31:57.421] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:57.421] - Launch lazy future ... [15:31:57.422] Packages needed by the future expression (n = 0): [15:31:57.422] Packages needed by future strategies (n = 0): [15:31:57.423] { [15:31:57.423] { [15:31:57.423] { [15:31:57.423] ...future.startTime <- base::Sys.time() [15:31:57.423] { [15:31:57.423] { [15:31:57.423] { [15:31:57.423] { [15:31:57.423] base::local({ [15:31:57.423] has_future <- base::requireNamespace("future", [15:31:57.423] quietly = TRUE) [15:31:57.423] if (has_future) { [15:31:57.423] ns <- base::getNamespace("future") [15:31:57.423] version <- ns[[".package"]][["version"]] [15:31:57.423] if (is.null(version)) [15:31:57.423] version <- utils::packageVersion("future") [15:31:57.423] } [15:31:57.423] else { [15:31:57.423] version <- NULL [15:31:57.423] } [15:31:57.423] if (!has_future || version < "1.8.0") { [15:31:57.423] info <- base::c(r_version = base::gsub("R version ", [15:31:57.423] "", base::R.version$version.string), [15:31:57.423] platform = base::sprintf("%s (%s-bit)", [15:31:57.423] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:57.423] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:57.423] "release", "version")], collapse = " "), [15:31:57.423] hostname = base::Sys.info()[["nodename"]]) [15:31:57.423] info <- base::sprintf("%s: %s", base::names(info), [15:31:57.423] info) [15:31:57.423] info <- base::paste(info, collapse = "; ") [15:31:57.423] if (!has_future) { [15:31:57.423] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:57.423] info) [15:31:57.423] } [15:31:57.423] else { [15:31:57.423] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:57.423] info, version) [15:31:57.423] } [15:31:57.423] base::stop(msg) [15:31:57.423] } [15:31:57.423] }) [15:31:57.423] } [15:31:57.423] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:57.423] base::options(mc.cores = 1L) [15:31:57.423] } [15:31:57.423] ...future.strategy.old <- future::plan("list") [15:31:57.423] options(future.plan = NULL) [15:31:57.423] Sys.unsetenv("R_FUTURE_PLAN") [15:31:57.423] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:57.423] } [15:31:57.423] ...future.workdir <- getwd() [15:31:57.423] } [15:31:57.423] ...future.oldOptions <- base::as.list(base::.Options) [15:31:57.423] ...future.oldEnvVars <- base::Sys.getenv() [15:31:57.423] } [15:31:57.423] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:57.423] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:57.423] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:57.423] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:57.423] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:57.423] future.stdout.windows.reencode = NULL, width = 80L) [15:31:57.423] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:57.423] base::names(...future.oldOptions)) [15:31:57.423] } [15:31:57.423] if (FALSE) { [15:31:57.423] } [15:31:57.423] else { [15:31:57.423] if (TRUE) { [15:31:57.423] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:57.423] open = "w") [15:31:57.423] } [15:31:57.423] else { [15:31:57.423] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:57.423] windows = "NUL", "/dev/null"), open = "w") [15:31:57.423] } [15:31:57.423] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:57.423] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:57.423] base::sink(type = "output", split = FALSE) [15:31:57.423] base::close(...future.stdout) [15:31:57.423] }, add = TRUE) [15:31:57.423] } [15:31:57.423] ...future.frame <- base::sys.nframe() [15:31:57.423] ...future.conditions <- base::list() [15:31:57.423] ...future.rng <- base::globalenv()$.Random.seed [15:31:57.423] if (FALSE) { [15:31:57.423] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:57.423] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:57.423] } [15:31:57.423] ...future.result <- base::tryCatch({ [15:31:57.423] base::withCallingHandlers({ [15:31:57.423] ...future.value <- base::withVisible(base::local({ [15:31:57.423] ...future.makeSendCondition <- base::local({ [15:31:57.423] sendCondition <- NULL [15:31:57.423] function(frame = 1L) { [15:31:57.423] if (is.function(sendCondition)) [15:31:57.423] return(sendCondition) [15:31:57.423] ns <- getNamespace("parallel") [15:31:57.423] if (exists("sendData", mode = "function", [15:31:57.423] envir = ns)) { [15:31:57.423] parallel_sendData <- get("sendData", mode = "function", [15:31:57.423] envir = ns) [15:31:57.423] envir <- sys.frame(frame) [15:31:57.423] master <- NULL [15:31:57.423] while (!identical(envir, .GlobalEnv) && [15:31:57.423] !identical(envir, emptyenv())) { [15:31:57.423] if (exists("master", mode = "list", envir = envir, [15:31:57.423] inherits = FALSE)) { [15:31:57.423] master <- get("master", mode = "list", [15:31:57.423] envir = envir, inherits = FALSE) [15:31:57.423] if (inherits(master, c("SOCKnode", [15:31:57.423] "SOCK0node"))) { [15:31:57.423] sendCondition <<- function(cond) { [15:31:57.423] data <- list(type = "VALUE", value = cond, [15:31:57.423] success = TRUE) [15:31:57.423] parallel_sendData(master, data) [15:31:57.423] } [15:31:57.423] return(sendCondition) [15:31:57.423] } [15:31:57.423] } [15:31:57.423] frame <- frame + 1L [15:31:57.423] envir <- sys.frame(frame) [15:31:57.423] } [15:31:57.423] } [15:31:57.423] sendCondition <<- function(cond) NULL [15:31:57.423] } [15:31:57.423] }) [15:31:57.423] withCallingHandlers({ [15:31:57.423] { [15:31:57.423] do.call(function(...) { [15:31:57.423] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.423] if (!identical(...future.globals.maxSize.org, [15:31:57.423] ...future.globals.maxSize)) { [15:31:57.423] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.423] on.exit(options(oopts), add = TRUE) [15:31:57.423] } [15:31:57.423] { [15:31:57.423] lapply(seq_along(...future.elements_ii), [15:31:57.423] FUN = function(jj) { [15:31:57.423] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.423] ...future.FUN(...future.X_jj, ...) [15:31:57.423] }) [15:31:57.423] } [15:31:57.423] }, args = future.call.arguments) [15:31:57.423] } [15:31:57.423] }, immediateCondition = function(cond) { [15:31:57.423] sendCondition <- ...future.makeSendCondition() [15:31:57.423] sendCondition(cond) [15:31:57.423] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.423] { [15:31:57.423] inherits <- base::inherits [15:31:57.423] invokeRestart <- base::invokeRestart [15:31:57.423] is.null <- base::is.null [15:31:57.423] muffled <- FALSE [15:31:57.423] if (inherits(cond, "message")) { [15:31:57.423] muffled <- grepl(pattern, "muffleMessage") [15:31:57.423] if (muffled) [15:31:57.423] invokeRestart("muffleMessage") [15:31:57.423] } [15:31:57.423] else if (inherits(cond, "warning")) { [15:31:57.423] muffled <- grepl(pattern, "muffleWarning") [15:31:57.423] if (muffled) [15:31:57.423] invokeRestart("muffleWarning") [15:31:57.423] } [15:31:57.423] else if (inherits(cond, "condition")) { [15:31:57.423] if (!is.null(pattern)) { [15:31:57.423] computeRestarts <- base::computeRestarts [15:31:57.423] grepl <- base::grepl [15:31:57.423] restarts <- computeRestarts(cond) [15:31:57.423] for (restart in restarts) { [15:31:57.423] name <- restart$name [15:31:57.423] if (is.null(name)) [15:31:57.423] next [15:31:57.423] if (!grepl(pattern, name)) [15:31:57.423] next [15:31:57.423] invokeRestart(restart) [15:31:57.423] muffled <- TRUE [15:31:57.423] break [15:31:57.423] } [15:31:57.423] } [15:31:57.423] } [15:31:57.423] invisible(muffled) [15:31:57.423] } [15:31:57.423] muffleCondition(cond) [15:31:57.423] }) [15:31:57.423] })) [15:31:57.423] future::FutureResult(value = ...future.value$value, [15:31:57.423] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:57.423] ...future.rng), globalenv = if (FALSE) [15:31:57.423] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:57.423] ...future.globalenv.names)) [15:31:57.423] else NULL, started = ...future.startTime, version = "1.8") [15:31:57.423] }, condition = base::local({ [15:31:57.423] c <- base::c [15:31:57.423] inherits <- base::inherits [15:31:57.423] invokeRestart <- base::invokeRestart [15:31:57.423] length <- base::length [15:31:57.423] list <- base::list [15:31:57.423] seq.int <- base::seq.int [15:31:57.423] signalCondition <- base::signalCondition [15:31:57.423] sys.calls <- base::sys.calls [15:31:57.423] `[[` <- base::`[[` [15:31:57.423] `+` <- base::`+` [15:31:57.423] `<<-` <- base::`<<-` [15:31:57.423] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:57.423] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:57.423] 3L)] [15:31:57.423] } [15:31:57.423] function(cond) { [15:31:57.423] is_error <- inherits(cond, "error") [15:31:57.423] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:57.423] NULL) [15:31:57.423] if (is_error) { [15:31:57.423] sessionInformation <- function() { [15:31:57.423] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:57.423] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:57.423] search = base::search(), system = base::Sys.info()) [15:31:57.423] } [15:31:57.423] ...future.conditions[[length(...future.conditions) + [15:31:57.423] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:57.423] cond$call), session = sessionInformation(), [15:31:57.423] timestamp = base::Sys.time(), signaled = 0L) [15:31:57.423] signalCondition(cond) [15:31:57.423] } [15:31:57.423] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:57.423] "immediateCondition"))) { [15:31:57.423] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:57.423] ...future.conditions[[length(...future.conditions) + [15:31:57.423] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:57.423] if (TRUE && !signal) { [15:31:57.423] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.423] { [15:31:57.423] inherits <- base::inherits [15:31:57.423] invokeRestart <- base::invokeRestart [15:31:57.423] is.null <- base::is.null [15:31:57.423] muffled <- FALSE [15:31:57.423] if (inherits(cond, "message")) { [15:31:57.423] muffled <- grepl(pattern, "muffleMessage") [15:31:57.423] if (muffled) [15:31:57.423] invokeRestart("muffleMessage") [15:31:57.423] } [15:31:57.423] else if (inherits(cond, "warning")) { [15:31:57.423] muffled <- grepl(pattern, "muffleWarning") [15:31:57.423] if (muffled) [15:31:57.423] invokeRestart("muffleWarning") [15:31:57.423] } [15:31:57.423] else if (inherits(cond, "condition")) { [15:31:57.423] if (!is.null(pattern)) { [15:31:57.423] computeRestarts <- base::computeRestarts [15:31:57.423] grepl <- base::grepl [15:31:57.423] restarts <- computeRestarts(cond) [15:31:57.423] for (restart in restarts) { [15:31:57.423] name <- restart$name [15:31:57.423] if (is.null(name)) [15:31:57.423] next [15:31:57.423] if (!grepl(pattern, name)) [15:31:57.423] next [15:31:57.423] invokeRestart(restart) [15:31:57.423] muffled <- TRUE [15:31:57.423] break [15:31:57.423] } [15:31:57.423] } [15:31:57.423] } [15:31:57.423] invisible(muffled) [15:31:57.423] } [15:31:57.423] muffleCondition(cond, pattern = "^muffle") [15:31:57.423] } [15:31:57.423] } [15:31:57.423] else { [15:31:57.423] if (TRUE) { [15:31:57.423] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.423] { [15:31:57.423] inherits <- base::inherits [15:31:57.423] invokeRestart <- base::invokeRestart [15:31:57.423] is.null <- base::is.null [15:31:57.423] muffled <- FALSE [15:31:57.423] if (inherits(cond, "message")) { [15:31:57.423] muffled <- grepl(pattern, "muffleMessage") [15:31:57.423] if (muffled) [15:31:57.423] invokeRestart("muffleMessage") [15:31:57.423] } [15:31:57.423] else if (inherits(cond, "warning")) { [15:31:57.423] muffled <- grepl(pattern, "muffleWarning") [15:31:57.423] if (muffled) [15:31:57.423] invokeRestart("muffleWarning") [15:31:57.423] } [15:31:57.423] else if (inherits(cond, "condition")) { [15:31:57.423] if (!is.null(pattern)) { [15:31:57.423] computeRestarts <- base::computeRestarts [15:31:57.423] grepl <- base::grepl [15:31:57.423] restarts <- computeRestarts(cond) [15:31:57.423] for (restart in restarts) { [15:31:57.423] name <- restart$name [15:31:57.423] if (is.null(name)) [15:31:57.423] next [15:31:57.423] if (!grepl(pattern, name)) [15:31:57.423] next [15:31:57.423] invokeRestart(restart) [15:31:57.423] muffled <- TRUE [15:31:57.423] break [15:31:57.423] } [15:31:57.423] } [15:31:57.423] } [15:31:57.423] invisible(muffled) [15:31:57.423] } [15:31:57.423] muffleCondition(cond, pattern = "^muffle") [15:31:57.423] } [15:31:57.423] } [15:31:57.423] } [15:31:57.423] })) [15:31:57.423] }, error = function(ex) { [15:31:57.423] base::structure(base::list(value = NULL, visible = NULL, [15:31:57.423] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:57.423] ...future.rng), started = ...future.startTime, [15:31:57.423] finished = Sys.time(), session_uuid = NA_character_, [15:31:57.423] version = "1.8"), class = "FutureResult") [15:31:57.423] }, finally = { [15:31:57.423] if (!identical(...future.workdir, getwd())) [15:31:57.423] setwd(...future.workdir) [15:31:57.423] { [15:31:57.423] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:57.423] ...future.oldOptions$nwarnings <- NULL [15:31:57.423] } [15:31:57.423] base::options(...future.oldOptions) [15:31:57.423] if (.Platform$OS.type == "windows") { [15:31:57.423] old_names <- names(...future.oldEnvVars) [15:31:57.423] envs <- base::Sys.getenv() [15:31:57.423] names <- names(envs) [15:31:57.423] common <- intersect(names, old_names) [15:31:57.423] added <- setdiff(names, old_names) [15:31:57.423] removed <- setdiff(old_names, names) [15:31:57.423] changed <- common[...future.oldEnvVars[common] != [15:31:57.423] envs[common]] [15:31:57.423] NAMES <- toupper(changed) [15:31:57.423] args <- list() [15:31:57.423] for (kk in seq_along(NAMES)) { [15:31:57.423] name <- changed[[kk]] [15:31:57.423] NAME <- NAMES[[kk]] [15:31:57.423] if (name != NAME && is.element(NAME, old_names)) [15:31:57.423] next [15:31:57.423] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:57.423] } [15:31:57.423] NAMES <- toupper(added) [15:31:57.423] for (kk in seq_along(NAMES)) { [15:31:57.423] name <- added[[kk]] [15:31:57.423] NAME <- NAMES[[kk]] [15:31:57.423] if (name != NAME && is.element(NAME, old_names)) [15:31:57.423] next [15:31:57.423] args[[name]] <- "" [15:31:57.423] } [15:31:57.423] NAMES <- toupper(removed) [15:31:57.423] for (kk in seq_along(NAMES)) { [15:31:57.423] name <- removed[[kk]] [15:31:57.423] NAME <- NAMES[[kk]] [15:31:57.423] if (name != NAME && is.element(NAME, old_names)) [15:31:57.423] next [15:31:57.423] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:57.423] } [15:31:57.423] if (length(args) > 0) [15:31:57.423] base::do.call(base::Sys.setenv, args = args) [15:31:57.423] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:57.423] } [15:31:57.423] else { [15:31:57.423] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:57.423] } [15:31:57.423] { [15:31:57.423] if (base::length(...future.futureOptionsAdded) > [15:31:57.423] 0L) { [15:31:57.423] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:57.423] base::names(opts) <- ...future.futureOptionsAdded [15:31:57.423] base::options(opts) [15:31:57.423] } [15:31:57.423] { [15:31:57.423] { [15:31:57.423] base::options(mc.cores = ...future.mc.cores.old) [15:31:57.423] NULL [15:31:57.423] } [15:31:57.423] options(future.plan = NULL) [15:31:57.423] if (is.na(NA_character_)) [15:31:57.423] Sys.unsetenv("R_FUTURE_PLAN") [15:31:57.423] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:57.423] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:57.423] .init = FALSE) [15:31:57.423] } [15:31:57.423] } [15:31:57.423] } [15:31:57.423] }) [15:31:57.423] if (TRUE) { [15:31:57.423] base::sink(type = "output", split = FALSE) [15:31:57.423] if (TRUE) { [15:31:57.423] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:57.423] } [15:31:57.423] else { [15:31:57.423] ...future.result["stdout"] <- base::list(NULL) [15:31:57.423] } [15:31:57.423] base::close(...future.stdout) [15:31:57.423] ...future.stdout <- NULL [15:31:57.423] } [15:31:57.423] ...future.result$conditions <- ...future.conditions [15:31:57.423] ...future.result$finished <- base::Sys.time() [15:31:57.423] ...future.result [15:31:57.423] } [15:31:57.432] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:57.432] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:57.433] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:57.433] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:57.434] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:57.434] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... [15:31:57.435] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... DONE [15:31:57.435] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:57.436] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:57.436] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:57.437] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:57.437] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:57.438] MultisessionFuture started [15:31:57.439] - Launch lazy future ... done [15:31:57.439] run() for 'MultisessionFuture' ... done [15:31:57.439] Created future: [15:31:57.470] receiveMessageFromWorker() for ClusterFuture ... [15:31:57.470] - Validating connection of MultisessionFuture [15:31:57.471] - received message: FutureResult [15:31:57.471] - Received FutureResult [15:31:57.472] - Erased future from FutureRegistry [15:31:57.472] result() for ClusterFuture ... [15:31:57.472] - result already collected: FutureResult [15:31:57.472] result() for ClusterFuture ... done [15:31:57.473] receiveMessageFromWorker() for ClusterFuture ... done [15:31:57.439] MultisessionFuture: [15:31:57.439] Label: 'future_lapply-1' [15:31:57.439] Expression: [15:31:57.439] { [15:31:57.439] do.call(function(...) { [15:31:57.439] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.439] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:57.439] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.439] on.exit(options(oopts), add = TRUE) [15:31:57.439] } [15:31:57.439] { [15:31:57.439] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:57.439] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.439] ...future.FUN(...future.X_jj, ...) [15:31:57.439] }) [15:31:57.439] } [15:31:57.439] }, args = future.call.arguments) [15:31:57.439] } [15:31:57.439] Lazy evaluation: FALSE [15:31:57.439] Asynchronous evaluation: TRUE [15:31:57.439] Local evaluation: TRUE [15:31:57.439] Environment: R_GlobalEnv [15:31:57.439] Capture standard output: TRUE [15:31:57.439] Capture condition classes: 'condition' (excluding 'nothing') [15:31:57.439] Globals: 5 objects totaling 2.41 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 224 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:57.439] Packages: [15:31:57.439] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:57.439] Resolved: TRUE [15:31:57.439] Value: [15:31:57.439] Conditions captured: [15:31:57.439] Early signaling: FALSE [15:31:57.439] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:57.439] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:57.473] Chunk #1 of 2 ... DONE [15:31:57.474] Chunk #2 of 2 ... [15:31:57.474] - Finding globals in 'X' for chunk #2 ... [15:31:57.474] getGlobalsAndPackages() ... [15:31:57.474] Searching for globals... [15:31:57.475] [15:31:57.475] Searching for globals ... DONE [15:31:57.476] - globals: [0] [15:31:57.476] getGlobalsAndPackages() ... DONE [15:31:57.476] + additional globals found: [n=0] [15:31:57.476] + additional namespaces needed: [n=0] [15:31:57.476] - Finding globals in 'X' for chunk #2 ... DONE [15:31:57.477] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:57.482] - seeds: [15:31:57.482] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.482] getGlobalsAndPackages() ... [15:31:57.482] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.483] Resolving globals: FALSE [15:31:57.483] Tweak future expression to call with '...' arguments ... [15:31:57.483] { [15:31:57.483] do.call(function(...) { [15:31:57.483] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.483] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:57.483] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.483] on.exit(options(oopts), add = TRUE) [15:31:57.483] } [15:31:57.483] { [15:31:57.483] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:57.483] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.483] ...future.FUN(...future.X_jj, ...) [15:31:57.483] }) [15:31:57.483] } [15:31:57.483] }, args = future.call.arguments) [15:31:57.483] } [15:31:57.484] Tweak future expression to call with '...' arguments ... DONE [15:31:57.485] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.485] [15:31:57.485] getGlobalsAndPackages() ... DONE [15:31:57.486] run() for 'Future' ... [15:31:57.486] - state: 'created' [15:31:57.487] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:57.504] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:57.504] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:57.504] - Field: 'node' [15:31:57.505] - Field: 'label' [15:31:57.505] - Field: 'local' [15:31:57.505] - Field: 'owner' [15:31:57.505] - Field: 'envir' [15:31:57.506] - Field: 'workers' [15:31:57.506] - Field: 'packages' [15:31:57.506] - Field: 'gc' [15:31:57.507] - Field: 'conditions' [15:31:57.507] - Field: 'persistent' [15:31:57.507] - Field: 'expr' [15:31:57.507] - Field: 'uuid' [15:31:57.508] - Field: 'seed' [15:31:57.508] - Field: 'version' [15:31:57.508] - Field: 'result' [15:31:57.508] - Field: 'asynchronous' [15:31:57.509] - Field: 'calls' [15:31:57.509] - Field: 'globals' [15:31:57.509] - Field: 'stdout' [15:31:57.509] - Field: 'earlySignal' [15:31:57.510] - Field: 'lazy' [15:31:57.510] - Field: 'state' [15:31:57.510] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:57.510] - Launch lazy future ... [15:31:57.511] Packages needed by the future expression (n = 0): [15:31:57.511] Packages needed by future strategies (n = 0): [15:31:57.512] { [15:31:57.512] { [15:31:57.512] { [15:31:57.512] ...future.startTime <- base::Sys.time() [15:31:57.512] { [15:31:57.512] { [15:31:57.512] { [15:31:57.512] { [15:31:57.512] base::local({ [15:31:57.512] has_future <- base::requireNamespace("future", [15:31:57.512] quietly = TRUE) [15:31:57.512] if (has_future) { [15:31:57.512] ns <- base::getNamespace("future") [15:31:57.512] version <- ns[[".package"]][["version"]] [15:31:57.512] if (is.null(version)) [15:31:57.512] version <- utils::packageVersion("future") [15:31:57.512] } [15:31:57.512] else { [15:31:57.512] version <- NULL [15:31:57.512] } [15:31:57.512] if (!has_future || version < "1.8.0") { [15:31:57.512] info <- base::c(r_version = base::gsub("R version ", [15:31:57.512] "", base::R.version$version.string), [15:31:57.512] platform = base::sprintf("%s (%s-bit)", [15:31:57.512] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:57.512] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:57.512] "release", "version")], collapse = " "), [15:31:57.512] hostname = base::Sys.info()[["nodename"]]) [15:31:57.512] info <- base::sprintf("%s: %s", base::names(info), [15:31:57.512] info) [15:31:57.512] info <- base::paste(info, collapse = "; ") [15:31:57.512] if (!has_future) { [15:31:57.512] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:57.512] info) [15:31:57.512] } [15:31:57.512] else { [15:31:57.512] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:57.512] info, version) [15:31:57.512] } [15:31:57.512] base::stop(msg) [15:31:57.512] } [15:31:57.512] }) [15:31:57.512] } [15:31:57.512] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:57.512] base::options(mc.cores = 1L) [15:31:57.512] } [15:31:57.512] ...future.strategy.old <- future::plan("list") [15:31:57.512] options(future.plan = NULL) [15:31:57.512] Sys.unsetenv("R_FUTURE_PLAN") [15:31:57.512] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:57.512] } [15:31:57.512] ...future.workdir <- getwd() [15:31:57.512] } [15:31:57.512] ...future.oldOptions <- base::as.list(base::.Options) [15:31:57.512] ...future.oldEnvVars <- base::Sys.getenv() [15:31:57.512] } [15:31:57.512] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:57.512] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:57.512] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:57.512] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:57.512] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:57.512] future.stdout.windows.reencode = NULL, width = 80L) [15:31:57.512] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:57.512] base::names(...future.oldOptions)) [15:31:57.512] } [15:31:57.512] if (FALSE) { [15:31:57.512] } [15:31:57.512] else { [15:31:57.512] if (TRUE) { [15:31:57.512] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:57.512] open = "w") [15:31:57.512] } [15:31:57.512] else { [15:31:57.512] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:57.512] windows = "NUL", "/dev/null"), open = "w") [15:31:57.512] } [15:31:57.512] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:57.512] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:57.512] base::sink(type = "output", split = FALSE) [15:31:57.512] base::close(...future.stdout) [15:31:57.512] }, add = TRUE) [15:31:57.512] } [15:31:57.512] ...future.frame <- base::sys.nframe() [15:31:57.512] ...future.conditions <- base::list() [15:31:57.512] ...future.rng <- base::globalenv()$.Random.seed [15:31:57.512] if (FALSE) { [15:31:57.512] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:57.512] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:57.512] } [15:31:57.512] ...future.result <- base::tryCatch({ [15:31:57.512] base::withCallingHandlers({ [15:31:57.512] ...future.value <- base::withVisible(base::local({ [15:31:57.512] ...future.makeSendCondition <- base::local({ [15:31:57.512] sendCondition <- NULL [15:31:57.512] function(frame = 1L) { [15:31:57.512] if (is.function(sendCondition)) [15:31:57.512] return(sendCondition) [15:31:57.512] ns <- getNamespace("parallel") [15:31:57.512] if (exists("sendData", mode = "function", [15:31:57.512] envir = ns)) { [15:31:57.512] parallel_sendData <- get("sendData", mode = "function", [15:31:57.512] envir = ns) [15:31:57.512] envir <- sys.frame(frame) [15:31:57.512] master <- NULL [15:31:57.512] while (!identical(envir, .GlobalEnv) && [15:31:57.512] !identical(envir, emptyenv())) { [15:31:57.512] if (exists("master", mode = "list", envir = envir, [15:31:57.512] inherits = FALSE)) { [15:31:57.512] master <- get("master", mode = "list", [15:31:57.512] envir = envir, inherits = FALSE) [15:31:57.512] if (inherits(master, c("SOCKnode", [15:31:57.512] "SOCK0node"))) { [15:31:57.512] sendCondition <<- function(cond) { [15:31:57.512] data <- list(type = "VALUE", value = cond, [15:31:57.512] success = TRUE) [15:31:57.512] parallel_sendData(master, data) [15:31:57.512] } [15:31:57.512] return(sendCondition) [15:31:57.512] } [15:31:57.512] } [15:31:57.512] frame <- frame + 1L [15:31:57.512] envir <- sys.frame(frame) [15:31:57.512] } [15:31:57.512] } [15:31:57.512] sendCondition <<- function(cond) NULL [15:31:57.512] } [15:31:57.512] }) [15:31:57.512] withCallingHandlers({ [15:31:57.512] { [15:31:57.512] do.call(function(...) { [15:31:57.512] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.512] if (!identical(...future.globals.maxSize.org, [15:31:57.512] ...future.globals.maxSize)) { [15:31:57.512] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.512] on.exit(options(oopts), add = TRUE) [15:31:57.512] } [15:31:57.512] { [15:31:57.512] lapply(seq_along(...future.elements_ii), [15:31:57.512] FUN = function(jj) { [15:31:57.512] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.512] ...future.FUN(...future.X_jj, ...) [15:31:57.512] }) [15:31:57.512] } [15:31:57.512] }, args = future.call.arguments) [15:31:57.512] } [15:31:57.512] }, immediateCondition = function(cond) { [15:31:57.512] sendCondition <- ...future.makeSendCondition() [15:31:57.512] sendCondition(cond) [15:31:57.512] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.512] { [15:31:57.512] inherits <- base::inherits [15:31:57.512] invokeRestart <- base::invokeRestart [15:31:57.512] is.null <- base::is.null [15:31:57.512] muffled <- FALSE [15:31:57.512] if (inherits(cond, "message")) { [15:31:57.512] muffled <- grepl(pattern, "muffleMessage") [15:31:57.512] if (muffled) [15:31:57.512] invokeRestart("muffleMessage") [15:31:57.512] } [15:31:57.512] else if (inherits(cond, "warning")) { [15:31:57.512] muffled <- grepl(pattern, "muffleWarning") [15:31:57.512] if (muffled) [15:31:57.512] invokeRestart("muffleWarning") [15:31:57.512] } [15:31:57.512] else if (inherits(cond, "condition")) { [15:31:57.512] if (!is.null(pattern)) { [15:31:57.512] computeRestarts <- base::computeRestarts [15:31:57.512] grepl <- base::grepl [15:31:57.512] restarts <- computeRestarts(cond) [15:31:57.512] for (restart in restarts) { [15:31:57.512] name <- restart$name [15:31:57.512] if (is.null(name)) [15:31:57.512] next [15:31:57.512] if (!grepl(pattern, name)) [15:31:57.512] next [15:31:57.512] invokeRestart(restart) [15:31:57.512] muffled <- TRUE [15:31:57.512] break [15:31:57.512] } [15:31:57.512] } [15:31:57.512] } [15:31:57.512] invisible(muffled) [15:31:57.512] } [15:31:57.512] muffleCondition(cond) [15:31:57.512] }) [15:31:57.512] })) [15:31:57.512] future::FutureResult(value = ...future.value$value, [15:31:57.512] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:57.512] ...future.rng), globalenv = if (FALSE) [15:31:57.512] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:57.512] ...future.globalenv.names)) [15:31:57.512] else NULL, started = ...future.startTime, version = "1.8") [15:31:57.512] }, condition = base::local({ [15:31:57.512] c <- base::c [15:31:57.512] inherits <- base::inherits [15:31:57.512] invokeRestart <- base::invokeRestart [15:31:57.512] length <- base::length [15:31:57.512] list <- base::list [15:31:57.512] seq.int <- base::seq.int [15:31:57.512] signalCondition <- base::signalCondition [15:31:57.512] sys.calls <- base::sys.calls [15:31:57.512] `[[` <- base::`[[` [15:31:57.512] `+` <- base::`+` [15:31:57.512] `<<-` <- base::`<<-` [15:31:57.512] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:57.512] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:57.512] 3L)] [15:31:57.512] } [15:31:57.512] function(cond) { [15:31:57.512] is_error <- inherits(cond, "error") [15:31:57.512] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:57.512] NULL) [15:31:57.512] if (is_error) { [15:31:57.512] sessionInformation <- function() { [15:31:57.512] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:57.512] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:57.512] search = base::search(), system = base::Sys.info()) [15:31:57.512] } [15:31:57.512] ...future.conditions[[length(...future.conditions) + [15:31:57.512] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:57.512] cond$call), session = sessionInformation(), [15:31:57.512] timestamp = base::Sys.time(), signaled = 0L) [15:31:57.512] signalCondition(cond) [15:31:57.512] } [15:31:57.512] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:57.512] "immediateCondition"))) { [15:31:57.512] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:57.512] ...future.conditions[[length(...future.conditions) + [15:31:57.512] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:57.512] if (TRUE && !signal) { [15:31:57.512] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.512] { [15:31:57.512] inherits <- base::inherits [15:31:57.512] invokeRestart <- base::invokeRestart [15:31:57.512] is.null <- base::is.null [15:31:57.512] muffled <- FALSE [15:31:57.512] if (inherits(cond, "message")) { [15:31:57.512] muffled <- grepl(pattern, "muffleMessage") [15:31:57.512] if (muffled) [15:31:57.512] invokeRestart("muffleMessage") [15:31:57.512] } [15:31:57.512] else if (inherits(cond, "warning")) { [15:31:57.512] muffled <- grepl(pattern, "muffleWarning") [15:31:57.512] if (muffled) [15:31:57.512] invokeRestart("muffleWarning") [15:31:57.512] } [15:31:57.512] else if (inherits(cond, "condition")) { [15:31:57.512] if (!is.null(pattern)) { [15:31:57.512] computeRestarts <- base::computeRestarts [15:31:57.512] grepl <- base::grepl [15:31:57.512] restarts <- computeRestarts(cond) [15:31:57.512] for (restart in restarts) { [15:31:57.512] name <- restart$name [15:31:57.512] if (is.null(name)) [15:31:57.512] next [15:31:57.512] if (!grepl(pattern, name)) [15:31:57.512] next [15:31:57.512] invokeRestart(restart) [15:31:57.512] muffled <- TRUE [15:31:57.512] break [15:31:57.512] } [15:31:57.512] } [15:31:57.512] } [15:31:57.512] invisible(muffled) [15:31:57.512] } [15:31:57.512] muffleCondition(cond, pattern = "^muffle") [15:31:57.512] } [15:31:57.512] } [15:31:57.512] else { [15:31:57.512] if (TRUE) { [15:31:57.512] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.512] { [15:31:57.512] inherits <- base::inherits [15:31:57.512] invokeRestart <- base::invokeRestart [15:31:57.512] is.null <- base::is.null [15:31:57.512] muffled <- FALSE [15:31:57.512] if (inherits(cond, "message")) { [15:31:57.512] muffled <- grepl(pattern, "muffleMessage") [15:31:57.512] if (muffled) [15:31:57.512] invokeRestart("muffleMessage") [15:31:57.512] } [15:31:57.512] else if (inherits(cond, "warning")) { [15:31:57.512] muffled <- grepl(pattern, "muffleWarning") [15:31:57.512] if (muffled) [15:31:57.512] invokeRestart("muffleWarning") [15:31:57.512] } [15:31:57.512] else if (inherits(cond, "condition")) { [15:31:57.512] if (!is.null(pattern)) { [15:31:57.512] computeRestarts <- base::computeRestarts [15:31:57.512] grepl <- base::grepl [15:31:57.512] restarts <- computeRestarts(cond) [15:31:57.512] for (restart in restarts) { [15:31:57.512] name <- restart$name [15:31:57.512] if (is.null(name)) [15:31:57.512] next [15:31:57.512] if (!grepl(pattern, name)) [15:31:57.512] next [15:31:57.512] invokeRestart(restart) [15:31:57.512] muffled <- TRUE [15:31:57.512] break [15:31:57.512] } [15:31:57.512] } [15:31:57.512] } [15:31:57.512] invisible(muffled) [15:31:57.512] } [15:31:57.512] muffleCondition(cond, pattern = "^muffle") [15:31:57.512] } [15:31:57.512] } [15:31:57.512] } [15:31:57.512] })) [15:31:57.512] }, error = function(ex) { [15:31:57.512] base::structure(base::list(value = NULL, visible = NULL, [15:31:57.512] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:57.512] ...future.rng), started = ...future.startTime, [15:31:57.512] finished = Sys.time(), session_uuid = NA_character_, [15:31:57.512] version = "1.8"), class = "FutureResult") [15:31:57.512] }, finally = { [15:31:57.512] if (!identical(...future.workdir, getwd())) [15:31:57.512] setwd(...future.workdir) [15:31:57.512] { [15:31:57.512] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:57.512] ...future.oldOptions$nwarnings <- NULL [15:31:57.512] } [15:31:57.512] base::options(...future.oldOptions) [15:31:57.512] if (.Platform$OS.type == "windows") { [15:31:57.512] old_names <- names(...future.oldEnvVars) [15:31:57.512] envs <- base::Sys.getenv() [15:31:57.512] names <- names(envs) [15:31:57.512] common <- intersect(names, old_names) [15:31:57.512] added <- setdiff(names, old_names) [15:31:57.512] removed <- setdiff(old_names, names) [15:31:57.512] changed <- common[...future.oldEnvVars[common] != [15:31:57.512] envs[common]] [15:31:57.512] NAMES <- toupper(changed) [15:31:57.512] args <- list() [15:31:57.512] for (kk in seq_along(NAMES)) { [15:31:57.512] name <- changed[[kk]] [15:31:57.512] NAME <- NAMES[[kk]] [15:31:57.512] if (name != NAME && is.element(NAME, old_names)) [15:31:57.512] next [15:31:57.512] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:57.512] } [15:31:57.512] NAMES <- toupper(added) [15:31:57.512] for (kk in seq_along(NAMES)) { [15:31:57.512] name <- added[[kk]] [15:31:57.512] NAME <- NAMES[[kk]] [15:31:57.512] if (name != NAME && is.element(NAME, old_names)) [15:31:57.512] next [15:31:57.512] args[[name]] <- "" [15:31:57.512] } [15:31:57.512] NAMES <- toupper(removed) [15:31:57.512] for (kk in seq_along(NAMES)) { [15:31:57.512] name <- removed[[kk]] [15:31:57.512] NAME <- NAMES[[kk]] [15:31:57.512] if (name != NAME && is.element(NAME, old_names)) [15:31:57.512] next [15:31:57.512] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:57.512] } [15:31:57.512] if (length(args) > 0) [15:31:57.512] base::do.call(base::Sys.setenv, args = args) [15:31:57.512] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:57.512] } [15:31:57.512] else { [15:31:57.512] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:57.512] } [15:31:57.512] { [15:31:57.512] if (base::length(...future.futureOptionsAdded) > [15:31:57.512] 0L) { [15:31:57.512] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:57.512] base::names(opts) <- ...future.futureOptionsAdded [15:31:57.512] base::options(opts) [15:31:57.512] } [15:31:57.512] { [15:31:57.512] { [15:31:57.512] base::options(mc.cores = ...future.mc.cores.old) [15:31:57.512] NULL [15:31:57.512] } [15:31:57.512] options(future.plan = NULL) [15:31:57.512] if (is.na(NA_character_)) [15:31:57.512] Sys.unsetenv("R_FUTURE_PLAN") [15:31:57.512] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:57.512] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:57.512] .init = FALSE) [15:31:57.512] } [15:31:57.512] } [15:31:57.512] } [15:31:57.512] }) [15:31:57.512] if (TRUE) { [15:31:57.512] base::sink(type = "output", split = FALSE) [15:31:57.512] if (TRUE) { [15:31:57.512] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:57.512] } [15:31:57.512] else { [15:31:57.512] ...future.result["stdout"] <- base::list(NULL) [15:31:57.512] } [15:31:57.512] base::close(...future.stdout) [15:31:57.512] ...future.stdout <- NULL [15:31:57.512] } [15:31:57.512] ...future.result$conditions <- ...future.conditions [15:31:57.512] ...future.result$finished <- base::Sys.time() [15:31:57.512] ...future.result [15:31:57.512] } [15:31:57.521] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:57.521] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:57.524] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:57.525] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:57.526] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:57.527] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... [15:31:57.528] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... DONE [15:31:57.528] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:57.528] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:57.529] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:57.529] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:57.530] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:57.531] MultisessionFuture started [15:31:57.531] - Launch lazy future ... done [15:31:57.531] run() for 'MultisessionFuture' ... done [15:31:57.532] Created future: [15:31:57.563] receiveMessageFromWorker() for ClusterFuture ... [15:31:57.564] - Validating connection of MultisessionFuture [15:31:57.564] - received message: FutureResult [15:31:57.565] - Received FutureResult [15:31:57.565] - Erased future from FutureRegistry [15:31:57.565] result() for ClusterFuture ... [15:31:57.566] - result already collected: FutureResult [15:31:57.566] result() for ClusterFuture ... done [15:31:57.566] receiveMessageFromWorker() for ClusterFuture ... done [15:31:57.532] MultisessionFuture: [15:31:57.532] Label: 'future_lapply-2' [15:31:57.532] Expression: [15:31:57.532] { [15:31:57.532] do.call(function(...) { [15:31:57.532] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.532] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:57.532] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.532] on.exit(options(oopts), add = TRUE) [15:31:57.532] } [15:31:57.532] { [15:31:57.532] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:57.532] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.532] ...future.FUN(...future.X_jj, ...) [15:31:57.532] }) [15:31:57.532] } [15:31:57.532] }, args = future.call.arguments) [15:31:57.532] } [15:31:57.532] Lazy evaluation: FALSE [15:31:57.532] Asynchronous evaluation: TRUE [15:31:57.532] Local evaluation: TRUE [15:31:57.532] Environment: R_GlobalEnv [15:31:57.532] Capture standard output: TRUE [15:31:57.532] Capture condition classes: 'condition' (excluding 'nothing') [15:31:57.532] Globals: 5 objects totaling 2.41 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 232 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:57.532] Packages: [15:31:57.532] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:57.532] Resolved: TRUE [15:31:57.532] Value: [15:31:57.532] Conditions captured: [15:31:57.532] Early signaling: FALSE [15:31:57.532] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:57.532] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:57.567] Chunk #2 of 2 ... DONE [15:31:57.567] Launching 2 futures (chunks) ... DONE [15:31:57.567] Resolving 2 futures (chunks) ... [15:31:57.568] resolve() on list ... [15:31:57.568] recursive: 0 [15:31:57.568] length: 2 [15:31:57.569] [15:31:57.569] Future #1 [15:31:57.569] result() for ClusterFuture ... [15:31:57.569] - result already collected: FutureResult [15:31:57.570] result() for ClusterFuture ... done [15:31:57.570] result() for ClusterFuture ... [15:31:57.570] - result already collected: FutureResult [15:31:57.570] result() for ClusterFuture ... done [15:31:57.571] signalConditionsASAP(MultisessionFuture, pos=1) ... [15:31:57.571] - nx: 2 [15:31:57.571] - relay: TRUE [15:31:57.571] - stdout: TRUE [15:31:57.572] - signal: TRUE [15:31:57.572] - resignal: FALSE [15:31:57.572] - force: TRUE [15:31:57.572] - relayed: [n=2] FALSE, FALSE [15:31:57.572] - queued futures: [n=2] FALSE, FALSE [15:31:57.573] - until=1 [15:31:57.573] - relaying element #1 [15:31:57.573] result() for ClusterFuture ... [15:31:57.574] - result already collected: FutureResult [15:31:57.574] result() for ClusterFuture ... done [15:31:57.574] result() for ClusterFuture ... [15:31:57.574] - result already collected: FutureResult [15:31:57.574] result() for ClusterFuture ... done [15:31:57.575] result() for ClusterFuture ... [15:31:57.575] - result already collected: FutureResult [15:31:57.575] result() for ClusterFuture ... done [15:31:57.576] result() for ClusterFuture ... [15:31:57.576] - result already collected: FutureResult [15:31:57.576] result() for ClusterFuture ... done [15:31:57.576] - relayed: [n=2] TRUE, FALSE [15:31:57.576] - queued futures: [n=2] TRUE, FALSE [15:31:57.577] signalConditionsASAP(MultisessionFuture, pos=1) ... done [15:31:57.577] length: 1 (resolved future 1) [15:31:57.577] Future #2 [15:31:57.578] result() for ClusterFuture ... [15:31:57.578] - result already collected: FutureResult [15:31:57.578] result() for ClusterFuture ... done [15:31:57.578] result() for ClusterFuture ... [15:31:57.579] - result already collected: FutureResult [15:31:57.579] result() for ClusterFuture ... done [15:31:57.579] signalConditionsASAP(MultisessionFuture, pos=2) ... [15:31:57.579] - nx: 2 [15:31:57.580] - relay: TRUE [15:31:57.580] - stdout: TRUE [15:31:57.580] - signal: TRUE [15:31:57.580] - resignal: FALSE [15:31:57.581] - force: TRUE [15:31:57.581] - relayed: [n=2] TRUE, FALSE [15:31:57.581] - queued futures: [n=2] TRUE, FALSE [15:31:57.581] - until=2 [15:31:57.581] - relaying element #2 [15:31:57.582] result() for ClusterFuture ... [15:31:57.582] - result already collected: FutureResult [15:31:57.582] result() for ClusterFuture ... done [15:31:57.582] result() for ClusterFuture ... [15:31:57.583] - result already collected: FutureResult [15:31:57.583] result() for ClusterFuture ... done [15:31:57.583] result() for ClusterFuture ... [15:31:57.584] - result already collected: FutureResult [15:31:57.584] result() for ClusterFuture ... done [15:31:57.584] result() for ClusterFuture ... [15:31:57.584] - result already collected: FutureResult [15:31:57.585] result() for ClusterFuture ... done [15:31:57.585] - relayed: [n=2] TRUE, TRUE [15:31:57.585] - queued futures: [n=2] TRUE, TRUE [15:31:57.585] signalConditionsASAP(MultisessionFuture, pos=2) ... done [15:31:57.586] length: 0 (resolved future 2) [15:31:57.586] Relaying remaining futures [15:31:57.586] signalConditionsASAP(NULL, pos=0) ... [15:31:57.586] - nx: 2 [15:31:57.587] - relay: TRUE [15:31:57.587] - stdout: TRUE [15:31:57.587] - signal: TRUE [15:31:57.587] - resignal: FALSE [15:31:57.588] - force: TRUE [15:31:57.588] - relayed: [n=2] TRUE, TRUE [15:31:57.588] - queued futures: [n=2] TRUE, TRUE - flush all [15:31:57.588] - relayed: [n=2] TRUE, TRUE [15:31:57.589] - queued futures: [n=2] TRUE, TRUE [15:31:57.589] signalConditionsASAP(NULL, pos=0) ... done [15:31:57.589] resolve() on list ... DONE [15:31:57.590] result() for ClusterFuture ... [15:31:57.590] - result already collected: FutureResult [15:31:57.590] result() for ClusterFuture ... done [15:31:57.590] result() for ClusterFuture ... [15:31:57.591] - result already collected: FutureResult [15:31:57.591] result() for ClusterFuture ... done [15:31:57.591] result() for ClusterFuture ... [15:31:57.591] - result already collected: FutureResult [15:31:57.592] result() for ClusterFuture ... done [15:31:57.592] result() for ClusterFuture ... [15:31:57.592] - result already collected: FutureResult [15:31:57.592] result() for ClusterFuture ... done [15:31:57.593] - Number of value chunks collected: 2 [15:31:57.593] Resolving 2 futures (chunks) ... DONE [15:31:57.593] Reducing values from 2 chunks ... [15:31:57.593] - Number of values collected after concatenation: 4 [15:31:57.594] - Number of values expected: 4 [15:31:57.594] Reducing values from 2 chunks ... DONE [15:31:57.594] 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 [15:31:57.598] future_lapply() ... [15:31:57.603] Number of chunks: 2 [15:31:57.603] getGlobalsAndPackagesXApply() ... [15:31:57.604] - future.globals: TRUE [15:31:57.604] getGlobalsAndPackages() ... [15:31:57.604] Searching for globals... [15:31:57.606] - globals found: [2] 'FUN', '.Internal' [15:31:57.607] Searching for globals ... DONE [15:31:57.607] Resolving globals: FALSE [15:31:57.608] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:57.608] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:57.609] - globals: [1] 'FUN' [15:31:57.609] [15:31:57.609] getGlobalsAndPackages() ... DONE [15:31:57.610] - globals found/used: [n=1] 'FUN' [15:31:57.610] - needed namespaces: [n=0] [15:31:57.610] Finding globals ... DONE [15:31:57.610] - use_args: TRUE [15:31:57.611] - Getting '...' globals ... [15:31:57.611] resolve() on list ... [15:31:57.611] recursive: 0 [15:31:57.612] length: 1 [15:31:57.612] elements: '...' [15:31:57.612] length: 0 (resolved future 1) [15:31:57.612] resolve() on list ... DONE [15:31:57.613] - '...' content: [n=1] 'length' [15:31:57.613] List of 1 [15:31:57.613] $ ...:List of 1 [15:31:57.613] ..$ length: int 2 [15:31:57.613] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:57.613] - attr(*, "where")=List of 1 [15:31:57.613] ..$ ...: [15:31:57.613] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:57.613] - attr(*, "resolved")= logi TRUE [15:31:57.613] - attr(*, "total_size")= num NA [15:31:57.618] - Getting '...' globals ... DONE [15:31:57.618] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:57.619] List of 2 [15:31:57.619] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:57.619] $ ... :List of 1 [15:31:57.619] ..$ length: int 2 [15:31:57.619] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:57.619] - attr(*, "where")=List of 2 [15:31:57.619] ..$ ...future.FUN: [15:31:57.619] ..$ ... : [15:31:57.619] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:57.619] - attr(*, "resolved")= logi FALSE [15:31:57.619] - attr(*, "total_size")= num 2240 [15:31:57.624] Packages to be attached in all futures: [n=0] [15:31:57.624] getGlobalsAndPackagesXApply() ... DONE [15:31:57.625] Number of futures (= number of chunks): 2 [15:31:57.625] Launching 2 futures (chunks) ... [15:31:57.625] Chunk #1 of 2 ... [15:31:57.625] - Finding globals in 'X' for chunk #1 ... [15:31:57.626] getGlobalsAndPackages() ... [15:31:57.626] Searching for globals... [15:31:57.627] [15:31:57.627] Searching for globals ... DONE [15:31:57.627] - globals: [0] [15:31:57.627] getGlobalsAndPackages() ... DONE [15:31:57.627] + additional globals found: [n=0] [15:31:57.628] + additional namespaces needed: [n=0] [15:31:57.628] - Finding globals in 'X' for chunk #1 ... DONE [15:31:57.628] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:57.628] - seeds: [15:31:57.629] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.629] getGlobalsAndPackages() ... [15:31:57.629] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.629] Resolving globals: FALSE [15:31:57.630] Tweak future expression to call with '...' arguments ... [15:31:57.630] { [15:31:57.630] do.call(function(...) { [15:31:57.630] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.630] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:57.630] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.630] on.exit(options(oopts), add = TRUE) [15:31:57.630] } [15:31:57.630] { [15:31:57.630] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:57.630] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.630] ...future.FUN(...future.X_jj, ...) [15:31:57.630] }) [15:31:57.630] } [15:31:57.630] }, args = future.call.arguments) [15:31:57.630] } [15:31:57.630] Tweak future expression to call with '...' arguments ... DONE [15:31:57.631] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.632] [15:31:57.632] getGlobalsAndPackages() ... DONE [15:31:57.632] run() for 'Future' ... [15:31:57.633] - state: 'created' [15:31:57.633] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:57.650] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:57.650] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:57.651] - Field: 'node' [15:31:57.651] - Field: 'label' [15:31:57.651] - Field: 'local' [15:31:57.652] - Field: 'owner' [15:31:57.652] - Field: 'envir' [15:31:57.652] - Field: 'workers' [15:31:57.652] - Field: 'packages' [15:31:57.653] - Field: 'gc' [15:31:57.653] - Field: 'conditions' [15:31:57.653] - Field: 'persistent' [15:31:57.653] - Field: 'expr' [15:31:57.654] - Field: 'uuid' [15:31:57.654] - Field: 'seed' [15:31:57.654] - Field: 'version' [15:31:57.655] - Field: 'result' [15:31:57.655] - Field: 'asynchronous' [15:31:57.655] - Field: 'calls' [15:31:57.655] - Field: 'globals' [15:31:57.656] - Field: 'stdout' [15:31:57.656] - Field: 'earlySignal' [15:31:57.656] - Field: 'lazy' [15:31:57.657] - Field: 'state' [15:31:57.657] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:57.657] - Launch lazy future ... [15:31:57.658] Packages needed by the future expression (n = 0): [15:31:57.658] Packages needed by future strategies (n = 0): [15:31:57.659] { [15:31:57.659] { [15:31:57.659] { [15:31:57.659] ...future.startTime <- base::Sys.time() [15:31:57.659] { [15:31:57.659] { [15:31:57.659] { [15:31:57.659] { [15:31:57.659] base::local({ [15:31:57.659] has_future <- base::requireNamespace("future", [15:31:57.659] quietly = TRUE) [15:31:57.659] if (has_future) { [15:31:57.659] ns <- base::getNamespace("future") [15:31:57.659] version <- ns[[".package"]][["version"]] [15:31:57.659] if (is.null(version)) [15:31:57.659] version <- utils::packageVersion("future") [15:31:57.659] } [15:31:57.659] else { [15:31:57.659] version <- NULL [15:31:57.659] } [15:31:57.659] if (!has_future || version < "1.8.0") { [15:31:57.659] info <- base::c(r_version = base::gsub("R version ", [15:31:57.659] "", base::R.version$version.string), [15:31:57.659] platform = base::sprintf("%s (%s-bit)", [15:31:57.659] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:57.659] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:57.659] "release", "version")], collapse = " "), [15:31:57.659] hostname = base::Sys.info()[["nodename"]]) [15:31:57.659] info <- base::sprintf("%s: %s", base::names(info), [15:31:57.659] info) [15:31:57.659] info <- base::paste(info, collapse = "; ") [15:31:57.659] if (!has_future) { [15:31:57.659] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:57.659] info) [15:31:57.659] } [15:31:57.659] else { [15:31:57.659] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:57.659] info, version) [15:31:57.659] } [15:31:57.659] base::stop(msg) [15:31:57.659] } [15:31:57.659] }) [15:31:57.659] } [15:31:57.659] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:57.659] base::options(mc.cores = 1L) [15:31:57.659] } [15:31:57.659] ...future.strategy.old <- future::plan("list") [15:31:57.659] options(future.plan = NULL) [15:31:57.659] Sys.unsetenv("R_FUTURE_PLAN") [15:31:57.659] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:57.659] } [15:31:57.659] ...future.workdir <- getwd() [15:31:57.659] } [15:31:57.659] ...future.oldOptions <- base::as.list(base::.Options) [15:31:57.659] ...future.oldEnvVars <- base::Sys.getenv() [15:31:57.659] } [15:31:57.659] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:57.659] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:57.659] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:57.659] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:57.659] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:57.659] future.stdout.windows.reencode = NULL, width = 80L) [15:31:57.659] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:57.659] base::names(...future.oldOptions)) [15:31:57.659] } [15:31:57.659] if (FALSE) { [15:31:57.659] } [15:31:57.659] else { [15:31:57.659] if (TRUE) { [15:31:57.659] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:57.659] open = "w") [15:31:57.659] } [15:31:57.659] else { [15:31:57.659] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:57.659] windows = "NUL", "/dev/null"), open = "w") [15:31:57.659] } [15:31:57.659] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:57.659] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:57.659] base::sink(type = "output", split = FALSE) [15:31:57.659] base::close(...future.stdout) [15:31:57.659] }, add = TRUE) [15:31:57.659] } [15:31:57.659] ...future.frame <- base::sys.nframe() [15:31:57.659] ...future.conditions <- base::list() [15:31:57.659] ...future.rng <- base::globalenv()$.Random.seed [15:31:57.659] if (FALSE) { [15:31:57.659] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:57.659] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:57.659] } [15:31:57.659] ...future.result <- base::tryCatch({ [15:31:57.659] base::withCallingHandlers({ [15:31:57.659] ...future.value <- base::withVisible(base::local({ [15:31:57.659] ...future.makeSendCondition <- base::local({ [15:31:57.659] sendCondition <- NULL [15:31:57.659] function(frame = 1L) { [15:31:57.659] if (is.function(sendCondition)) [15:31:57.659] return(sendCondition) [15:31:57.659] ns <- getNamespace("parallel") [15:31:57.659] if (exists("sendData", mode = "function", [15:31:57.659] envir = ns)) { [15:31:57.659] parallel_sendData <- get("sendData", mode = "function", [15:31:57.659] envir = ns) [15:31:57.659] envir <- sys.frame(frame) [15:31:57.659] master <- NULL [15:31:57.659] while (!identical(envir, .GlobalEnv) && [15:31:57.659] !identical(envir, emptyenv())) { [15:31:57.659] if (exists("master", mode = "list", envir = envir, [15:31:57.659] inherits = FALSE)) { [15:31:57.659] master <- get("master", mode = "list", [15:31:57.659] envir = envir, inherits = FALSE) [15:31:57.659] if (inherits(master, c("SOCKnode", [15:31:57.659] "SOCK0node"))) { [15:31:57.659] sendCondition <<- function(cond) { [15:31:57.659] data <- list(type = "VALUE", value = cond, [15:31:57.659] success = TRUE) [15:31:57.659] parallel_sendData(master, data) [15:31:57.659] } [15:31:57.659] return(sendCondition) [15:31:57.659] } [15:31:57.659] } [15:31:57.659] frame <- frame + 1L [15:31:57.659] envir <- sys.frame(frame) [15:31:57.659] } [15:31:57.659] } [15:31:57.659] sendCondition <<- function(cond) NULL [15:31:57.659] } [15:31:57.659] }) [15:31:57.659] withCallingHandlers({ [15:31:57.659] { [15:31:57.659] do.call(function(...) { [15:31:57.659] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.659] if (!identical(...future.globals.maxSize.org, [15:31:57.659] ...future.globals.maxSize)) { [15:31:57.659] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.659] on.exit(options(oopts), add = TRUE) [15:31:57.659] } [15:31:57.659] { [15:31:57.659] lapply(seq_along(...future.elements_ii), [15:31:57.659] FUN = function(jj) { [15:31:57.659] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.659] ...future.FUN(...future.X_jj, ...) [15:31:57.659] }) [15:31:57.659] } [15:31:57.659] }, args = future.call.arguments) [15:31:57.659] } [15:31:57.659] }, immediateCondition = function(cond) { [15:31:57.659] sendCondition <- ...future.makeSendCondition() [15:31:57.659] sendCondition(cond) [15:31:57.659] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.659] { [15:31:57.659] inherits <- base::inherits [15:31:57.659] invokeRestart <- base::invokeRestart [15:31:57.659] is.null <- base::is.null [15:31:57.659] muffled <- FALSE [15:31:57.659] if (inherits(cond, "message")) { [15:31:57.659] muffled <- grepl(pattern, "muffleMessage") [15:31:57.659] if (muffled) [15:31:57.659] invokeRestart("muffleMessage") [15:31:57.659] } [15:31:57.659] else if (inherits(cond, "warning")) { [15:31:57.659] muffled <- grepl(pattern, "muffleWarning") [15:31:57.659] if (muffled) [15:31:57.659] invokeRestart("muffleWarning") [15:31:57.659] } [15:31:57.659] else if (inherits(cond, "condition")) { [15:31:57.659] if (!is.null(pattern)) { [15:31:57.659] computeRestarts <- base::computeRestarts [15:31:57.659] grepl <- base::grepl [15:31:57.659] restarts <- computeRestarts(cond) [15:31:57.659] for (restart in restarts) { [15:31:57.659] name <- restart$name [15:31:57.659] if (is.null(name)) [15:31:57.659] next [15:31:57.659] if (!grepl(pattern, name)) [15:31:57.659] next [15:31:57.659] invokeRestart(restart) [15:31:57.659] muffled <- TRUE [15:31:57.659] break [15:31:57.659] } [15:31:57.659] } [15:31:57.659] } [15:31:57.659] invisible(muffled) [15:31:57.659] } [15:31:57.659] muffleCondition(cond) [15:31:57.659] }) [15:31:57.659] })) [15:31:57.659] future::FutureResult(value = ...future.value$value, [15:31:57.659] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:57.659] ...future.rng), globalenv = if (FALSE) [15:31:57.659] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:57.659] ...future.globalenv.names)) [15:31:57.659] else NULL, started = ...future.startTime, version = "1.8") [15:31:57.659] }, condition = base::local({ [15:31:57.659] c <- base::c [15:31:57.659] inherits <- base::inherits [15:31:57.659] invokeRestart <- base::invokeRestart [15:31:57.659] length <- base::length [15:31:57.659] list <- base::list [15:31:57.659] seq.int <- base::seq.int [15:31:57.659] signalCondition <- base::signalCondition [15:31:57.659] sys.calls <- base::sys.calls [15:31:57.659] `[[` <- base::`[[` [15:31:57.659] `+` <- base::`+` [15:31:57.659] `<<-` <- base::`<<-` [15:31:57.659] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:57.659] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:57.659] 3L)] [15:31:57.659] } [15:31:57.659] function(cond) { [15:31:57.659] is_error <- inherits(cond, "error") [15:31:57.659] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:57.659] NULL) [15:31:57.659] if (is_error) { [15:31:57.659] sessionInformation <- function() { [15:31:57.659] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:57.659] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:57.659] search = base::search(), system = base::Sys.info()) [15:31:57.659] } [15:31:57.659] ...future.conditions[[length(...future.conditions) + [15:31:57.659] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:57.659] cond$call), session = sessionInformation(), [15:31:57.659] timestamp = base::Sys.time(), signaled = 0L) [15:31:57.659] signalCondition(cond) [15:31:57.659] } [15:31:57.659] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:57.659] "immediateCondition"))) { [15:31:57.659] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:57.659] ...future.conditions[[length(...future.conditions) + [15:31:57.659] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:57.659] if (TRUE && !signal) { [15:31:57.659] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.659] { [15:31:57.659] inherits <- base::inherits [15:31:57.659] invokeRestart <- base::invokeRestart [15:31:57.659] is.null <- base::is.null [15:31:57.659] muffled <- FALSE [15:31:57.659] if (inherits(cond, "message")) { [15:31:57.659] muffled <- grepl(pattern, "muffleMessage") [15:31:57.659] if (muffled) [15:31:57.659] invokeRestart("muffleMessage") [15:31:57.659] } [15:31:57.659] else if (inherits(cond, "warning")) { [15:31:57.659] muffled <- grepl(pattern, "muffleWarning") [15:31:57.659] if (muffled) [15:31:57.659] invokeRestart("muffleWarning") [15:31:57.659] } [15:31:57.659] else if (inherits(cond, "condition")) { [15:31:57.659] if (!is.null(pattern)) { [15:31:57.659] computeRestarts <- base::computeRestarts [15:31:57.659] grepl <- base::grepl [15:31:57.659] restarts <- computeRestarts(cond) [15:31:57.659] for (restart in restarts) { [15:31:57.659] name <- restart$name [15:31:57.659] if (is.null(name)) [15:31:57.659] next [15:31:57.659] if (!grepl(pattern, name)) [15:31:57.659] next [15:31:57.659] invokeRestart(restart) [15:31:57.659] muffled <- TRUE [15:31:57.659] break [15:31:57.659] } [15:31:57.659] } [15:31:57.659] } [15:31:57.659] invisible(muffled) [15:31:57.659] } [15:31:57.659] muffleCondition(cond, pattern = "^muffle") [15:31:57.659] } [15:31:57.659] } [15:31:57.659] else { [15:31:57.659] if (TRUE) { [15:31:57.659] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.659] { [15:31:57.659] inherits <- base::inherits [15:31:57.659] invokeRestart <- base::invokeRestart [15:31:57.659] is.null <- base::is.null [15:31:57.659] muffled <- FALSE [15:31:57.659] if (inherits(cond, "message")) { [15:31:57.659] muffled <- grepl(pattern, "muffleMessage") [15:31:57.659] if (muffled) [15:31:57.659] invokeRestart("muffleMessage") [15:31:57.659] } [15:31:57.659] else if (inherits(cond, "warning")) { [15:31:57.659] muffled <- grepl(pattern, "muffleWarning") [15:31:57.659] if (muffled) [15:31:57.659] invokeRestart("muffleWarning") [15:31:57.659] } [15:31:57.659] else if (inherits(cond, "condition")) { [15:31:57.659] if (!is.null(pattern)) { [15:31:57.659] computeRestarts <- base::computeRestarts [15:31:57.659] grepl <- base::grepl [15:31:57.659] restarts <- computeRestarts(cond) [15:31:57.659] for (restart in restarts) { [15:31:57.659] name <- restart$name [15:31:57.659] if (is.null(name)) [15:31:57.659] next [15:31:57.659] if (!grepl(pattern, name)) [15:31:57.659] next [15:31:57.659] invokeRestart(restart) [15:31:57.659] muffled <- TRUE [15:31:57.659] break [15:31:57.659] } [15:31:57.659] } [15:31:57.659] } [15:31:57.659] invisible(muffled) [15:31:57.659] } [15:31:57.659] muffleCondition(cond, pattern = "^muffle") [15:31:57.659] } [15:31:57.659] } [15:31:57.659] } [15:31:57.659] })) [15:31:57.659] }, error = function(ex) { [15:31:57.659] base::structure(base::list(value = NULL, visible = NULL, [15:31:57.659] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:57.659] ...future.rng), started = ...future.startTime, [15:31:57.659] finished = Sys.time(), session_uuid = NA_character_, [15:31:57.659] version = "1.8"), class = "FutureResult") [15:31:57.659] }, finally = { [15:31:57.659] if (!identical(...future.workdir, getwd())) [15:31:57.659] setwd(...future.workdir) [15:31:57.659] { [15:31:57.659] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:57.659] ...future.oldOptions$nwarnings <- NULL [15:31:57.659] } [15:31:57.659] base::options(...future.oldOptions) [15:31:57.659] if (.Platform$OS.type == "windows") { [15:31:57.659] old_names <- names(...future.oldEnvVars) [15:31:57.659] envs <- base::Sys.getenv() [15:31:57.659] names <- names(envs) [15:31:57.659] common <- intersect(names, old_names) [15:31:57.659] added <- setdiff(names, old_names) [15:31:57.659] removed <- setdiff(old_names, names) [15:31:57.659] changed <- common[...future.oldEnvVars[common] != [15:31:57.659] envs[common]] [15:31:57.659] NAMES <- toupper(changed) [15:31:57.659] args <- list() [15:31:57.659] for (kk in seq_along(NAMES)) { [15:31:57.659] name <- changed[[kk]] [15:31:57.659] NAME <- NAMES[[kk]] [15:31:57.659] if (name != NAME && is.element(NAME, old_names)) [15:31:57.659] next [15:31:57.659] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:57.659] } [15:31:57.659] NAMES <- toupper(added) [15:31:57.659] for (kk in seq_along(NAMES)) { [15:31:57.659] name <- added[[kk]] [15:31:57.659] NAME <- NAMES[[kk]] [15:31:57.659] if (name != NAME && is.element(NAME, old_names)) [15:31:57.659] next [15:31:57.659] args[[name]] <- "" [15:31:57.659] } [15:31:57.659] NAMES <- toupper(removed) [15:31:57.659] for (kk in seq_along(NAMES)) { [15:31:57.659] name <- removed[[kk]] [15:31:57.659] NAME <- NAMES[[kk]] [15:31:57.659] if (name != NAME && is.element(NAME, old_names)) [15:31:57.659] next [15:31:57.659] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:57.659] } [15:31:57.659] if (length(args) > 0) [15:31:57.659] base::do.call(base::Sys.setenv, args = args) [15:31:57.659] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:57.659] } [15:31:57.659] else { [15:31:57.659] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:57.659] } [15:31:57.659] { [15:31:57.659] if (base::length(...future.futureOptionsAdded) > [15:31:57.659] 0L) { [15:31:57.659] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:57.659] base::names(opts) <- ...future.futureOptionsAdded [15:31:57.659] base::options(opts) [15:31:57.659] } [15:31:57.659] { [15:31:57.659] { [15:31:57.659] base::options(mc.cores = ...future.mc.cores.old) [15:31:57.659] NULL [15:31:57.659] } [15:31:57.659] options(future.plan = NULL) [15:31:57.659] if (is.na(NA_character_)) [15:31:57.659] Sys.unsetenv("R_FUTURE_PLAN") [15:31:57.659] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:57.659] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:57.659] .init = FALSE) [15:31:57.659] } [15:31:57.659] } [15:31:57.659] } [15:31:57.659] }) [15:31:57.659] if (TRUE) { [15:31:57.659] base::sink(type = "output", split = FALSE) [15:31:57.659] if (TRUE) { [15:31:57.659] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:57.659] } [15:31:57.659] else { [15:31:57.659] ...future.result["stdout"] <- base::list(NULL) [15:31:57.659] } [15:31:57.659] base::close(...future.stdout) [15:31:57.659] ...future.stdout <- NULL [15:31:57.659] } [15:31:57.659] ...future.result$conditions <- ...future.conditions [15:31:57.659] ...future.result$finished <- base::Sys.time() [15:31:57.659] ...future.result [15:31:57.659] } [15:31:57.668] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:57.668] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:57.669] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:57.669] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:57.670] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:57.670] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... [15:31:57.670] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... DONE [15:31:57.671] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:57.671] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:57.672] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:57.672] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:57.672] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:57.673] MultisessionFuture started [15:31:57.673] - Launch lazy future ... done [15:31:57.674] run() for 'MultisessionFuture' ... done [15:31:57.674] Created future: [15:31:57.705] receiveMessageFromWorker() for ClusterFuture ... [15:31:57.706] - Validating connection of MultisessionFuture [15:31:57.706] - received message: FutureResult [15:31:57.707] - Received FutureResult [15:31:57.707] - Erased future from FutureRegistry [15:31:57.707] result() for ClusterFuture ... [15:31:57.708] - result already collected: FutureResult [15:31:57.708] result() for ClusterFuture ... done [15:31:57.708] receiveMessageFromWorker() for ClusterFuture ... done [15:31:57.674] MultisessionFuture: [15:31:57.674] Label: 'future_lapply-1' [15:31:57.674] Expression: [15:31:57.674] { [15:31:57.674] do.call(function(...) { [15:31:57.674] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.674] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:57.674] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.674] on.exit(options(oopts), add = TRUE) [15:31:57.674] } [15:31:57.674] { [15:31:57.674] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:57.674] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.674] ...future.FUN(...future.X_jj, ...) [15:31:57.674] }) [15:31:57.674] } [15:31:57.674] }, args = future.call.arguments) [15:31:57.674] } [15:31:57.674] Lazy evaluation: FALSE [15:31:57.674] Asynchronous evaluation: TRUE [15:31:57.674] Local evaluation: TRUE [15:31:57.674] Environment: R_GlobalEnv [15:31:57.674] Capture standard output: TRUE [15:31:57.674] Capture condition classes: 'condition' (excluding 'nothing') [15:31:57.674] Globals: 5 objects totaling 2.41 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 224 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:57.674] Packages: [15:31:57.674] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:57.674] Resolved: TRUE [15:31:57.674] Value: [15:31:57.674] Conditions captured: [15:31:57.674] Early signaling: FALSE [15:31:57.674] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:57.674] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:57.709] Chunk #1 of 2 ... DONE [15:31:57.709] Chunk #2 of 2 ... [15:31:57.709] - Finding globals in 'X' for chunk #2 ... [15:31:57.710] getGlobalsAndPackages() ... [15:31:57.710] Searching for globals... [15:31:57.710] [15:31:57.711] Searching for globals ... DONE [15:31:57.711] - globals: [0] [15:31:57.711] getGlobalsAndPackages() ... DONE [15:31:57.711] + additional globals found: [n=0] [15:31:57.712] + additional namespaces needed: [n=0] [15:31:57.712] - Finding globals in 'X' for chunk #2 ... DONE [15:31:57.712] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:57.712] - seeds: [15:31:57.713] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.713] getGlobalsAndPackages() ... [15:31:57.713] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.713] Resolving globals: FALSE [15:31:57.714] Tweak future expression to call with '...' arguments ... [15:31:57.714] { [15:31:57.714] do.call(function(...) { [15:31:57.714] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.714] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:57.714] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.714] on.exit(options(oopts), add = TRUE) [15:31:57.714] } [15:31:57.714] { [15:31:57.714] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:57.714] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.714] ...future.FUN(...future.X_jj, ...) [15:31:57.714] }) [15:31:57.714] } [15:31:57.714] }, args = future.call.arguments) [15:31:57.714] } [15:31:57.715] Tweak future expression to call with '...' arguments ... DONE [15:31:57.716] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.716] [15:31:57.716] getGlobalsAndPackages() ... DONE [15:31:57.717] run() for 'Future' ... [15:31:57.717] - state: 'created' [15:31:57.717] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:57.734] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:57.734] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:57.735] - Field: 'node' [15:31:57.735] - Field: 'label' [15:31:57.735] - Field: 'local' [15:31:57.735] - Field: 'owner' [15:31:57.736] - Field: 'envir' [15:31:57.736] - Field: 'workers' [15:31:57.736] - Field: 'packages' [15:31:57.737] - Field: 'gc' [15:31:57.737] - Field: 'conditions' [15:31:57.737] - Field: 'persistent' [15:31:57.737] - Field: 'expr' [15:31:57.738] - Field: 'uuid' [15:31:57.738] - Field: 'seed' [15:31:57.738] - Field: 'version' [15:31:57.738] - Field: 'result' [15:31:57.739] - Field: 'asynchronous' [15:31:57.739] - Field: 'calls' [15:31:57.739] - Field: 'globals' [15:31:57.740] - Field: 'stdout' [15:31:57.740] - Field: 'earlySignal' [15:31:57.740] - Field: 'lazy' [15:31:57.741] - Field: 'state' [15:31:57.741] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:57.741] - Launch lazy future ... [15:31:57.742] Packages needed by the future expression (n = 0): [15:31:57.742] Packages needed by future strategies (n = 0): [15:31:57.743] { [15:31:57.743] { [15:31:57.743] { [15:31:57.743] ...future.startTime <- base::Sys.time() [15:31:57.743] { [15:31:57.743] { [15:31:57.743] { [15:31:57.743] { [15:31:57.743] base::local({ [15:31:57.743] has_future <- base::requireNamespace("future", [15:31:57.743] quietly = TRUE) [15:31:57.743] if (has_future) { [15:31:57.743] ns <- base::getNamespace("future") [15:31:57.743] version <- ns[[".package"]][["version"]] [15:31:57.743] if (is.null(version)) [15:31:57.743] version <- utils::packageVersion("future") [15:31:57.743] } [15:31:57.743] else { [15:31:57.743] version <- NULL [15:31:57.743] } [15:31:57.743] if (!has_future || version < "1.8.0") { [15:31:57.743] info <- base::c(r_version = base::gsub("R version ", [15:31:57.743] "", base::R.version$version.string), [15:31:57.743] platform = base::sprintf("%s (%s-bit)", [15:31:57.743] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:57.743] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:57.743] "release", "version")], collapse = " "), [15:31:57.743] hostname = base::Sys.info()[["nodename"]]) [15:31:57.743] info <- base::sprintf("%s: %s", base::names(info), [15:31:57.743] info) [15:31:57.743] info <- base::paste(info, collapse = "; ") [15:31:57.743] if (!has_future) { [15:31:57.743] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:57.743] info) [15:31:57.743] } [15:31:57.743] else { [15:31:57.743] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:57.743] info, version) [15:31:57.743] } [15:31:57.743] base::stop(msg) [15:31:57.743] } [15:31:57.743] }) [15:31:57.743] } [15:31:57.743] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:57.743] base::options(mc.cores = 1L) [15:31:57.743] } [15:31:57.743] ...future.strategy.old <- future::plan("list") [15:31:57.743] options(future.plan = NULL) [15:31:57.743] Sys.unsetenv("R_FUTURE_PLAN") [15:31:57.743] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:57.743] } [15:31:57.743] ...future.workdir <- getwd() [15:31:57.743] } [15:31:57.743] ...future.oldOptions <- base::as.list(base::.Options) [15:31:57.743] ...future.oldEnvVars <- base::Sys.getenv() [15:31:57.743] } [15:31:57.743] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:57.743] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:57.743] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:57.743] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:57.743] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:57.743] future.stdout.windows.reencode = NULL, width = 80L) [15:31:57.743] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:57.743] base::names(...future.oldOptions)) [15:31:57.743] } [15:31:57.743] if (FALSE) { [15:31:57.743] } [15:31:57.743] else { [15:31:57.743] if (TRUE) { [15:31:57.743] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:57.743] open = "w") [15:31:57.743] } [15:31:57.743] else { [15:31:57.743] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:57.743] windows = "NUL", "/dev/null"), open = "w") [15:31:57.743] } [15:31:57.743] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:57.743] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:57.743] base::sink(type = "output", split = FALSE) [15:31:57.743] base::close(...future.stdout) [15:31:57.743] }, add = TRUE) [15:31:57.743] } [15:31:57.743] ...future.frame <- base::sys.nframe() [15:31:57.743] ...future.conditions <- base::list() [15:31:57.743] ...future.rng <- base::globalenv()$.Random.seed [15:31:57.743] if (FALSE) { [15:31:57.743] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:57.743] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:57.743] } [15:31:57.743] ...future.result <- base::tryCatch({ [15:31:57.743] base::withCallingHandlers({ [15:31:57.743] ...future.value <- base::withVisible(base::local({ [15:31:57.743] ...future.makeSendCondition <- base::local({ [15:31:57.743] sendCondition <- NULL [15:31:57.743] function(frame = 1L) { [15:31:57.743] if (is.function(sendCondition)) [15:31:57.743] return(sendCondition) [15:31:57.743] ns <- getNamespace("parallel") [15:31:57.743] if (exists("sendData", mode = "function", [15:31:57.743] envir = ns)) { [15:31:57.743] parallel_sendData <- get("sendData", mode = "function", [15:31:57.743] envir = ns) [15:31:57.743] envir <- sys.frame(frame) [15:31:57.743] master <- NULL [15:31:57.743] while (!identical(envir, .GlobalEnv) && [15:31:57.743] !identical(envir, emptyenv())) { [15:31:57.743] if (exists("master", mode = "list", envir = envir, [15:31:57.743] inherits = FALSE)) { [15:31:57.743] master <- get("master", mode = "list", [15:31:57.743] envir = envir, inherits = FALSE) [15:31:57.743] if (inherits(master, c("SOCKnode", [15:31:57.743] "SOCK0node"))) { [15:31:57.743] sendCondition <<- function(cond) { [15:31:57.743] data <- list(type = "VALUE", value = cond, [15:31:57.743] success = TRUE) [15:31:57.743] parallel_sendData(master, data) [15:31:57.743] } [15:31:57.743] return(sendCondition) [15:31:57.743] } [15:31:57.743] } [15:31:57.743] frame <- frame + 1L [15:31:57.743] envir <- sys.frame(frame) [15:31:57.743] } [15:31:57.743] } [15:31:57.743] sendCondition <<- function(cond) NULL [15:31:57.743] } [15:31:57.743] }) [15:31:57.743] withCallingHandlers({ [15:31:57.743] { [15:31:57.743] do.call(function(...) { [15:31:57.743] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.743] if (!identical(...future.globals.maxSize.org, [15:31:57.743] ...future.globals.maxSize)) { [15:31:57.743] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.743] on.exit(options(oopts), add = TRUE) [15:31:57.743] } [15:31:57.743] { [15:31:57.743] lapply(seq_along(...future.elements_ii), [15:31:57.743] FUN = function(jj) { [15:31:57.743] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.743] ...future.FUN(...future.X_jj, ...) [15:31:57.743] }) [15:31:57.743] } [15:31:57.743] }, args = future.call.arguments) [15:31:57.743] } [15:31:57.743] }, immediateCondition = function(cond) { [15:31:57.743] sendCondition <- ...future.makeSendCondition() [15:31:57.743] sendCondition(cond) [15:31:57.743] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.743] { [15:31:57.743] inherits <- base::inherits [15:31:57.743] invokeRestart <- base::invokeRestart [15:31:57.743] is.null <- base::is.null [15:31:57.743] muffled <- FALSE [15:31:57.743] if (inherits(cond, "message")) { [15:31:57.743] muffled <- grepl(pattern, "muffleMessage") [15:31:57.743] if (muffled) [15:31:57.743] invokeRestart("muffleMessage") [15:31:57.743] } [15:31:57.743] else if (inherits(cond, "warning")) { [15:31:57.743] muffled <- grepl(pattern, "muffleWarning") [15:31:57.743] if (muffled) [15:31:57.743] invokeRestart("muffleWarning") [15:31:57.743] } [15:31:57.743] else if (inherits(cond, "condition")) { [15:31:57.743] if (!is.null(pattern)) { [15:31:57.743] computeRestarts <- base::computeRestarts [15:31:57.743] grepl <- base::grepl [15:31:57.743] restarts <- computeRestarts(cond) [15:31:57.743] for (restart in restarts) { [15:31:57.743] name <- restart$name [15:31:57.743] if (is.null(name)) [15:31:57.743] next [15:31:57.743] if (!grepl(pattern, name)) [15:31:57.743] next [15:31:57.743] invokeRestart(restart) [15:31:57.743] muffled <- TRUE [15:31:57.743] break [15:31:57.743] } [15:31:57.743] } [15:31:57.743] } [15:31:57.743] invisible(muffled) [15:31:57.743] } [15:31:57.743] muffleCondition(cond) [15:31:57.743] }) [15:31:57.743] })) [15:31:57.743] future::FutureResult(value = ...future.value$value, [15:31:57.743] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:57.743] ...future.rng), globalenv = if (FALSE) [15:31:57.743] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:57.743] ...future.globalenv.names)) [15:31:57.743] else NULL, started = ...future.startTime, version = "1.8") [15:31:57.743] }, condition = base::local({ [15:31:57.743] c <- base::c [15:31:57.743] inherits <- base::inherits [15:31:57.743] invokeRestart <- base::invokeRestart [15:31:57.743] length <- base::length [15:31:57.743] list <- base::list [15:31:57.743] seq.int <- base::seq.int [15:31:57.743] signalCondition <- base::signalCondition [15:31:57.743] sys.calls <- base::sys.calls [15:31:57.743] `[[` <- base::`[[` [15:31:57.743] `+` <- base::`+` [15:31:57.743] `<<-` <- base::`<<-` [15:31:57.743] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:57.743] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:57.743] 3L)] [15:31:57.743] } [15:31:57.743] function(cond) { [15:31:57.743] is_error <- inherits(cond, "error") [15:31:57.743] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:57.743] NULL) [15:31:57.743] if (is_error) { [15:31:57.743] sessionInformation <- function() { [15:31:57.743] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:57.743] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:57.743] search = base::search(), system = base::Sys.info()) [15:31:57.743] } [15:31:57.743] ...future.conditions[[length(...future.conditions) + [15:31:57.743] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:57.743] cond$call), session = sessionInformation(), [15:31:57.743] timestamp = base::Sys.time(), signaled = 0L) [15:31:57.743] signalCondition(cond) [15:31:57.743] } [15:31:57.743] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:57.743] "immediateCondition"))) { [15:31:57.743] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:57.743] ...future.conditions[[length(...future.conditions) + [15:31:57.743] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:57.743] if (TRUE && !signal) { [15:31:57.743] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.743] { [15:31:57.743] inherits <- base::inherits [15:31:57.743] invokeRestart <- base::invokeRestart [15:31:57.743] is.null <- base::is.null [15:31:57.743] muffled <- FALSE [15:31:57.743] if (inherits(cond, "message")) { [15:31:57.743] muffled <- grepl(pattern, "muffleMessage") [15:31:57.743] if (muffled) [15:31:57.743] invokeRestart("muffleMessage") [15:31:57.743] } [15:31:57.743] else if (inherits(cond, "warning")) { [15:31:57.743] muffled <- grepl(pattern, "muffleWarning") [15:31:57.743] if (muffled) [15:31:57.743] invokeRestart("muffleWarning") [15:31:57.743] } [15:31:57.743] else if (inherits(cond, "condition")) { [15:31:57.743] if (!is.null(pattern)) { [15:31:57.743] computeRestarts <- base::computeRestarts [15:31:57.743] grepl <- base::grepl [15:31:57.743] restarts <- computeRestarts(cond) [15:31:57.743] for (restart in restarts) { [15:31:57.743] name <- restart$name [15:31:57.743] if (is.null(name)) [15:31:57.743] next [15:31:57.743] if (!grepl(pattern, name)) [15:31:57.743] next [15:31:57.743] invokeRestart(restart) [15:31:57.743] muffled <- TRUE [15:31:57.743] break [15:31:57.743] } [15:31:57.743] } [15:31:57.743] } [15:31:57.743] invisible(muffled) [15:31:57.743] } [15:31:57.743] muffleCondition(cond, pattern = "^muffle") [15:31:57.743] } [15:31:57.743] } [15:31:57.743] else { [15:31:57.743] if (TRUE) { [15:31:57.743] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.743] { [15:31:57.743] inherits <- base::inherits [15:31:57.743] invokeRestart <- base::invokeRestart [15:31:57.743] is.null <- base::is.null [15:31:57.743] muffled <- FALSE [15:31:57.743] if (inherits(cond, "message")) { [15:31:57.743] muffled <- grepl(pattern, "muffleMessage") [15:31:57.743] if (muffled) [15:31:57.743] invokeRestart("muffleMessage") [15:31:57.743] } [15:31:57.743] else if (inherits(cond, "warning")) { [15:31:57.743] muffled <- grepl(pattern, "muffleWarning") [15:31:57.743] if (muffled) [15:31:57.743] invokeRestart("muffleWarning") [15:31:57.743] } [15:31:57.743] else if (inherits(cond, "condition")) { [15:31:57.743] if (!is.null(pattern)) { [15:31:57.743] computeRestarts <- base::computeRestarts [15:31:57.743] grepl <- base::grepl [15:31:57.743] restarts <- computeRestarts(cond) [15:31:57.743] for (restart in restarts) { [15:31:57.743] name <- restart$name [15:31:57.743] if (is.null(name)) [15:31:57.743] next [15:31:57.743] if (!grepl(pattern, name)) [15:31:57.743] next [15:31:57.743] invokeRestart(restart) [15:31:57.743] muffled <- TRUE [15:31:57.743] break [15:31:57.743] } [15:31:57.743] } [15:31:57.743] } [15:31:57.743] invisible(muffled) [15:31:57.743] } [15:31:57.743] muffleCondition(cond, pattern = "^muffle") [15:31:57.743] } [15:31:57.743] } [15:31:57.743] } [15:31:57.743] })) [15:31:57.743] }, error = function(ex) { [15:31:57.743] base::structure(base::list(value = NULL, visible = NULL, [15:31:57.743] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:57.743] ...future.rng), started = ...future.startTime, [15:31:57.743] finished = Sys.time(), session_uuid = NA_character_, [15:31:57.743] version = "1.8"), class = "FutureResult") [15:31:57.743] }, finally = { [15:31:57.743] if (!identical(...future.workdir, getwd())) [15:31:57.743] setwd(...future.workdir) [15:31:57.743] { [15:31:57.743] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:57.743] ...future.oldOptions$nwarnings <- NULL [15:31:57.743] } [15:31:57.743] base::options(...future.oldOptions) [15:31:57.743] if (.Platform$OS.type == "windows") { [15:31:57.743] old_names <- names(...future.oldEnvVars) [15:31:57.743] envs <- base::Sys.getenv() [15:31:57.743] names <- names(envs) [15:31:57.743] common <- intersect(names, old_names) [15:31:57.743] added <- setdiff(names, old_names) [15:31:57.743] removed <- setdiff(old_names, names) [15:31:57.743] changed <- common[...future.oldEnvVars[common] != [15:31:57.743] envs[common]] [15:31:57.743] NAMES <- toupper(changed) [15:31:57.743] args <- list() [15:31:57.743] for (kk in seq_along(NAMES)) { [15:31:57.743] name <- changed[[kk]] [15:31:57.743] NAME <- NAMES[[kk]] [15:31:57.743] if (name != NAME && is.element(NAME, old_names)) [15:31:57.743] next [15:31:57.743] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:57.743] } [15:31:57.743] NAMES <- toupper(added) [15:31:57.743] for (kk in seq_along(NAMES)) { [15:31:57.743] name <- added[[kk]] [15:31:57.743] NAME <- NAMES[[kk]] [15:31:57.743] if (name != NAME && is.element(NAME, old_names)) [15:31:57.743] next [15:31:57.743] args[[name]] <- "" [15:31:57.743] } [15:31:57.743] NAMES <- toupper(removed) [15:31:57.743] for (kk in seq_along(NAMES)) { [15:31:57.743] name <- removed[[kk]] [15:31:57.743] NAME <- NAMES[[kk]] [15:31:57.743] if (name != NAME && is.element(NAME, old_names)) [15:31:57.743] next [15:31:57.743] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:57.743] } [15:31:57.743] if (length(args) > 0) [15:31:57.743] base::do.call(base::Sys.setenv, args = args) [15:31:57.743] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:57.743] } [15:31:57.743] else { [15:31:57.743] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:57.743] } [15:31:57.743] { [15:31:57.743] if (base::length(...future.futureOptionsAdded) > [15:31:57.743] 0L) { [15:31:57.743] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:57.743] base::names(opts) <- ...future.futureOptionsAdded [15:31:57.743] base::options(opts) [15:31:57.743] } [15:31:57.743] { [15:31:57.743] { [15:31:57.743] base::options(mc.cores = ...future.mc.cores.old) [15:31:57.743] NULL [15:31:57.743] } [15:31:57.743] options(future.plan = NULL) [15:31:57.743] if (is.na(NA_character_)) [15:31:57.743] Sys.unsetenv("R_FUTURE_PLAN") [15:31:57.743] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:57.743] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:57.743] .init = FALSE) [15:31:57.743] } [15:31:57.743] } [15:31:57.743] } [15:31:57.743] }) [15:31:57.743] if (TRUE) { [15:31:57.743] base::sink(type = "output", split = FALSE) [15:31:57.743] if (TRUE) { [15:31:57.743] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:57.743] } [15:31:57.743] else { [15:31:57.743] ...future.result["stdout"] <- base::list(NULL) [15:31:57.743] } [15:31:57.743] base::close(...future.stdout) [15:31:57.743] ...future.stdout <- NULL [15:31:57.743] } [15:31:57.743] ...future.result$conditions <- ...future.conditions [15:31:57.743] ...future.result$finished <- base::Sys.time() [15:31:57.743] ...future.result [15:31:57.743] } [15:31:57.752] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:57.752] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:57.753] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:57.754] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:57.755] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:57.755] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... [15:31:57.755] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... DONE [15:31:57.756] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:57.756] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:57.757] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:57.757] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:57.757] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:57.758] MultisessionFuture started [15:31:57.759] - Launch lazy future ... done [15:31:57.759] run() for 'MultisessionFuture' ... done [15:31:57.759] Created future: [15:31:57.787] receiveMessageFromWorker() for ClusterFuture ... [15:31:57.788] - Validating connection of MultisessionFuture [15:31:57.788] - received message: FutureResult [15:31:57.788] - Received FutureResult [15:31:57.789] - Erased future from FutureRegistry [15:31:57.789] result() for ClusterFuture ... [15:31:57.789] - result already collected: FutureResult [15:31:57.789] result() for ClusterFuture ... done [15:31:57.789] receiveMessageFromWorker() for ClusterFuture ... done [15:31:57.759] MultisessionFuture: [15:31:57.759] Label: 'future_lapply-2' [15:31:57.759] Expression: [15:31:57.759] { [15:31:57.759] do.call(function(...) { [15:31:57.759] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.759] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:57.759] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.759] on.exit(options(oopts), add = TRUE) [15:31:57.759] } [15:31:57.759] { [15:31:57.759] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:57.759] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.759] ...future.FUN(...future.X_jj, ...) [15:31:57.759] }) [15:31:57.759] } [15:31:57.759] }, args = future.call.arguments) [15:31:57.759] } [15:31:57.759] Lazy evaluation: FALSE [15:31:57.759] Asynchronous evaluation: TRUE [15:31:57.759] Local evaluation: TRUE [15:31:57.759] Environment: R_GlobalEnv [15:31:57.759] Capture standard output: TRUE [15:31:57.759] Capture condition classes: 'condition' (excluding 'nothing') [15:31:57.759] Globals: 5 objects totaling 2.41 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 232 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:57.759] Packages: [15:31:57.759] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:57.759] Resolved: TRUE [15:31:57.759] Value: [15:31:57.759] Conditions captured: [15:31:57.759] Early signaling: FALSE [15:31:57.759] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:57.759] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:57.790] Chunk #2 of 2 ... DONE [15:31:57.790] Launching 2 futures (chunks) ... DONE [15:31:57.790] Resolving 2 futures (chunks) ... [15:31:57.791] resolve() on list ... [15:31:57.791] recursive: 0 [15:31:57.791] length: 2 [15:31:57.791] [15:31:57.791] Future #1 [15:31:57.791] result() for ClusterFuture ... [15:31:57.792] - result already collected: FutureResult [15:31:57.792] result() for ClusterFuture ... done [15:31:57.792] result() for ClusterFuture ... [15:31:57.792] - result already collected: FutureResult [15:31:57.792] result() for ClusterFuture ... done [15:31:57.793] signalConditionsASAP(MultisessionFuture, pos=1) ... [15:31:57.793] - nx: 2 [15:31:57.793] - relay: TRUE [15:31:57.793] - stdout: TRUE [15:31:57.793] - signal: TRUE [15:31:57.793] - resignal: FALSE [15:31:57.794] - force: TRUE [15:31:57.794] - relayed: [n=2] FALSE, FALSE [15:31:57.794] - queued futures: [n=2] FALSE, FALSE [15:31:57.794] - until=1 [15:31:57.794] - relaying element #1 [15:31:57.794] result() for ClusterFuture ... [15:31:57.795] - result already collected: FutureResult [15:31:57.795] result() for ClusterFuture ... done [15:31:57.795] result() for ClusterFuture ... [15:31:57.795] - result already collected: FutureResult [15:31:57.795] result() for ClusterFuture ... done [15:31:57.795] result() for ClusterFuture ... [15:31:57.796] - result already collected: FutureResult [15:31:57.796] result() for ClusterFuture ... done [15:31:57.796] result() for ClusterFuture ... [15:31:57.796] - result already collected: FutureResult [15:31:57.796] result() for ClusterFuture ... done [15:31:57.796] - relayed: [n=2] TRUE, FALSE [15:31:57.797] - queued futures: [n=2] TRUE, FALSE [15:31:57.797] signalConditionsASAP(MultisessionFuture, pos=1) ... done [15:31:57.797] length: 1 (resolved future 1) [15:31:57.797] Future #2 [15:31:57.797] result() for ClusterFuture ... [15:31:57.798] - result already collected: FutureResult [15:31:57.798] result() for ClusterFuture ... done [15:31:57.798] result() for ClusterFuture ... [15:31:57.798] - result already collected: FutureResult [15:31:57.798] result() for ClusterFuture ... done [15:31:57.798] signalConditionsASAP(MultisessionFuture, pos=2) ... [15:31:57.799] - nx: 2 [15:31:57.799] - relay: TRUE [15:31:57.799] - stdout: TRUE [15:31:57.799] - signal: TRUE [15:31:57.799] - resignal: FALSE [15:31:57.802] - force: TRUE [15:31:57.803] - relayed: [n=2] TRUE, FALSE [15:31:57.803] - queued futures: [n=2] TRUE, FALSE [15:31:57.803] - until=2 [15:31:57.803] - relaying element #2 [15:31:57.803] result() for ClusterFuture ... [15:31:57.803] - result already collected: FutureResult [15:31:57.804] result() for ClusterFuture ... done [15:31:57.804] result() for ClusterFuture ... [15:31:57.804] - result already collected: FutureResult [15:31:57.804] result() for ClusterFuture ... done [15:31:57.804] result() for ClusterFuture ... [15:31:57.805] - result already collected: FutureResult [15:31:57.805] result() for ClusterFuture ... done [15:31:57.805] result() for ClusterFuture ... [15:31:57.805] - result already collected: FutureResult [15:31:57.805] result() for ClusterFuture ... done [15:31:57.805] - relayed: [n=2] TRUE, TRUE [15:31:57.805] - queued futures: [n=2] TRUE, TRUE [15:31:57.806] signalConditionsASAP(MultisessionFuture, pos=2) ... done [15:31:57.806] length: 0 (resolved future 2) [15:31:57.806] Relaying remaining futures [15:31:57.806] signalConditionsASAP(NULL, pos=0) ... [15:31:57.806] - nx: 2 [15:31:57.806] - relay: TRUE [15:31:57.807] - stdout: TRUE [15:31:57.807] - signal: TRUE [15:31:57.807] - resignal: FALSE [15:31:57.807] - force: TRUE [15:31:57.807] - relayed: [n=2] TRUE, TRUE [15:31:57.807] - queued futures: [n=2] TRUE, TRUE - flush all [15:31:57.808] - relayed: [n=2] TRUE, TRUE [15:31:57.808] - queued futures: [n=2] TRUE, TRUE [15:31:57.808] signalConditionsASAP(NULL, pos=0) ... done [15:31:57.808] resolve() on list ... DONE [15:31:57.808] result() for ClusterFuture ... [15:31:57.808] - result already collected: FutureResult [15:31:57.809] result() for ClusterFuture ... done [15:31:57.809] result() for ClusterFuture ... [15:31:57.809] - result already collected: FutureResult [15:31:57.809] result() for ClusterFuture ... done [15:31:57.809] result() for ClusterFuture ... [15:31:57.809] - result already collected: FutureResult [15:31:57.810] result() for ClusterFuture ... done [15:31:57.810] result() for ClusterFuture ... [15:31:57.810] - result already collected: FutureResult [15:31:57.810] result() for ClusterFuture ... done [15:31:57.810] - Number of value chunks collected: 2 [15:31:57.810] Resolving 2 futures (chunks) ... DONE [15:31:57.811] Reducing values from 2 chunks ... [15:31:57.811] - Number of values collected after concatenation: 4 [15:31:57.811] - Number of values expected: 4 [15:31:57.811] Reducing values from 2 chunks ... DONE [15:31:57.811] 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, ...) ... [15:31:57.816] future_lapply() ... [15:31:57.819] Number of chunks: 2 [15:31:57.819] getGlobalsAndPackagesXApply() ... [15:31:57.820] - future.globals: TRUE [15:31:57.820] getGlobalsAndPackages() ... [15:31:57.820] Searching for globals... [15:31:57.822] - globals found: [2] 'FUN', '.Internal' [15:31:57.822] Searching for globals ... DONE [15:31:57.822] Resolving globals: FALSE [15:31:57.823] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:57.823] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:57.823] - globals: [1] 'FUN' [15:31:57.824] [15:31:57.824] getGlobalsAndPackages() ... DONE [15:31:57.824] - globals found/used: [n=1] 'FUN' [15:31:57.824] - needed namespaces: [n=0] [15:31:57.824] Finding globals ... DONE [15:31:57.824] - use_args: TRUE [15:31:57.825] - Getting '...' globals ... [15:31:57.825] resolve() on list ... [15:31:57.825] recursive: 0 [15:31:57.825] length: 1 [15:31:57.826] elements: '...' [15:31:57.826] length: 0 (resolved future 1) [15:31:57.826] resolve() on list ... DONE [15:31:57.826] - '...' content: [n=1] 'length' [15:31:57.826] List of 1 [15:31:57.826] $ ...:List of 1 [15:31:57.826] ..$ length: int 2 [15:31:57.826] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:57.826] - attr(*, "where")=List of 1 [15:31:57.826] ..$ ...: [15:31:57.826] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:57.826] - attr(*, "resolved")= logi TRUE [15:31:57.826] - attr(*, "total_size")= num NA [15:31:57.830] - Getting '...' globals ... DONE [15:31:57.831] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:57.831] List of 2 [15:31:57.831] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:57.831] $ ... :List of 1 [15:31:57.831] ..$ length: int 2 [15:31:57.831] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:57.831] - attr(*, "where")=List of 2 [15:31:57.831] ..$ ...future.FUN: [15:31:57.831] ..$ ... : [15:31:57.831] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:57.831] - attr(*, "resolved")= logi FALSE [15:31:57.831] - attr(*, "total_size")= num 2240 [15:31:57.835] Packages to be attached in all futures: [n=0] [15:31:57.835] getGlobalsAndPackagesXApply() ... DONE [15:31:57.835] Number of futures (= number of chunks): 2 [15:31:57.835] Launching 2 futures (chunks) ... [15:31:57.836] Chunk #1 of 2 ... [15:31:57.836] - Finding globals in 'X' for chunk #1 ... [15:31:57.836] getGlobalsAndPackages() ... [15:31:57.836] Searching for globals... [15:31:57.836] [15:31:57.837] Searching for globals ... DONE [15:31:57.837] - globals: [0] [15:31:57.837] getGlobalsAndPackages() ... DONE [15:31:57.837] + additional globals found: [n=0] [15:31:57.837] + additional namespaces needed: [n=0] [15:31:57.838] - Finding globals in 'X' for chunk #1 ... DONE [15:31:57.838] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:57.838] - seeds: [15:31:57.838] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.838] getGlobalsAndPackages() ... [15:31:57.838] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.839] Resolving globals: FALSE [15:31:57.839] Tweak future expression to call with '...' arguments ... [15:31:57.839] { [15:31:57.839] do.call(function(...) { [15:31:57.839] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.839] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:57.839] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.839] on.exit(options(oopts), add = TRUE) [15:31:57.839] } [15:31:57.839] { [15:31:57.839] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:57.839] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.839] ...future.FUN(...future.X_jj, ...) [15:31:57.839] }) [15:31:57.839] } [15:31:57.839] }, args = future.call.arguments) [15:31:57.839] } [15:31:57.840] Tweak future expression to call with '...' arguments ... DONE [15:31:57.840] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.840] [15:31:57.840] getGlobalsAndPackages() ... DONE [15:31:57.841] run() for 'Future' ... [15:31:57.841] - state: 'created' [15:31:57.841] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:57.857] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:57.857] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:57.857] - Field: 'node' [15:31:57.857] - Field: 'label' [15:31:57.858] - Field: 'local' [15:31:57.858] - Field: 'owner' [15:31:57.858] - Field: 'envir' [15:31:57.858] - Field: 'workers' [15:31:57.858] - Field: 'packages' [15:31:57.859] - Field: 'gc' [15:31:57.859] - Field: 'conditions' [15:31:57.859] - Field: 'persistent' [15:31:57.859] - Field: 'expr' [15:31:57.859] - Field: 'uuid' [15:31:57.859] - Field: 'seed' [15:31:57.860] - Field: 'version' [15:31:57.860] - Field: 'result' [15:31:57.860] - Field: 'asynchronous' [15:31:57.860] - Field: 'calls' [15:31:57.860] - Field: 'globals' [15:31:57.861] - Field: 'stdout' [15:31:57.861] - Field: 'earlySignal' [15:31:57.861] - Field: 'lazy' [15:31:57.861] - Field: 'state' [15:31:57.861] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:57.861] - Launch lazy future ... [15:31:57.862] Packages needed by the future expression (n = 0): [15:31:57.862] Packages needed by future strategies (n = 0): [15:31:57.863] { [15:31:57.863] { [15:31:57.863] { [15:31:57.863] ...future.startTime <- base::Sys.time() [15:31:57.863] { [15:31:57.863] { [15:31:57.863] { [15:31:57.863] { [15:31:57.863] base::local({ [15:31:57.863] has_future <- base::requireNamespace("future", [15:31:57.863] quietly = TRUE) [15:31:57.863] if (has_future) { [15:31:57.863] ns <- base::getNamespace("future") [15:31:57.863] version <- ns[[".package"]][["version"]] [15:31:57.863] if (is.null(version)) [15:31:57.863] version <- utils::packageVersion("future") [15:31:57.863] } [15:31:57.863] else { [15:31:57.863] version <- NULL [15:31:57.863] } [15:31:57.863] if (!has_future || version < "1.8.0") { [15:31:57.863] info <- base::c(r_version = base::gsub("R version ", [15:31:57.863] "", base::R.version$version.string), [15:31:57.863] platform = base::sprintf("%s (%s-bit)", [15:31:57.863] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:57.863] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:57.863] "release", "version")], collapse = " "), [15:31:57.863] hostname = base::Sys.info()[["nodename"]]) [15:31:57.863] info <- base::sprintf("%s: %s", base::names(info), [15:31:57.863] info) [15:31:57.863] info <- base::paste(info, collapse = "; ") [15:31:57.863] if (!has_future) { [15:31:57.863] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:57.863] info) [15:31:57.863] } [15:31:57.863] else { [15:31:57.863] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:57.863] info, version) [15:31:57.863] } [15:31:57.863] base::stop(msg) [15:31:57.863] } [15:31:57.863] }) [15:31:57.863] } [15:31:57.863] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:57.863] base::options(mc.cores = 1L) [15:31:57.863] } [15:31:57.863] ...future.strategy.old <- future::plan("list") [15:31:57.863] options(future.plan = NULL) [15:31:57.863] Sys.unsetenv("R_FUTURE_PLAN") [15:31:57.863] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:57.863] } [15:31:57.863] ...future.workdir <- getwd() [15:31:57.863] } [15:31:57.863] ...future.oldOptions <- base::as.list(base::.Options) [15:31:57.863] ...future.oldEnvVars <- base::Sys.getenv() [15:31:57.863] } [15:31:57.863] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:57.863] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:57.863] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:57.863] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:57.863] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:57.863] future.stdout.windows.reencode = NULL, width = 80L) [15:31:57.863] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:57.863] base::names(...future.oldOptions)) [15:31:57.863] } [15:31:57.863] if (FALSE) { [15:31:57.863] } [15:31:57.863] else { [15:31:57.863] if (TRUE) { [15:31:57.863] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:57.863] open = "w") [15:31:57.863] } [15:31:57.863] else { [15:31:57.863] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:57.863] windows = "NUL", "/dev/null"), open = "w") [15:31:57.863] } [15:31:57.863] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:57.863] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:57.863] base::sink(type = "output", split = FALSE) [15:31:57.863] base::close(...future.stdout) [15:31:57.863] }, add = TRUE) [15:31:57.863] } [15:31:57.863] ...future.frame <- base::sys.nframe() [15:31:57.863] ...future.conditions <- base::list() [15:31:57.863] ...future.rng <- base::globalenv()$.Random.seed [15:31:57.863] if (FALSE) { [15:31:57.863] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:57.863] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:57.863] } [15:31:57.863] ...future.result <- base::tryCatch({ [15:31:57.863] base::withCallingHandlers({ [15:31:57.863] ...future.value <- base::withVisible(base::local({ [15:31:57.863] ...future.makeSendCondition <- base::local({ [15:31:57.863] sendCondition <- NULL [15:31:57.863] function(frame = 1L) { [15:31:57.863] if (is.function(sendCondition)) [15:31:57.863] return(sendCondition) [15:31:57.863] ns <- getNamespace("parallel") [15:31:57.863] if (exists("sendData", mode = "function", [15:31:57.863] envir = ns)) { [15:31:57.863] parallel_sendData <- get("sendData", mode = "function", [15:31:57.863] envir = ns) [15:31:57.863] envir <- sys.frame(frame) [15:31:57.863] master <- NULL [15:31:57.863] while (!identical(envir, .GlobalEnv) && [15:31:57.863] !identical(envir, emptyenv())) { [15:31:57.863] if (exists("master", mode = "list", envir = envir, [15:31:57.863] inherits = FALSE)) { [15:31:57.863] master <- get("master", mode = "list", [15:31:57.863] envir = envir, inherits = FALSE) [15:31:57.863] if (inherits(master, c("SOCKnode", [15:31:57.863] "SOCK0node"))) { [15:31:57.863] sendCondition <<- function(cond) { [15:31:57.863] data <- list(type = "VALUE", value = cond, [15:31:57.863] success = TRUE) [15:31:57.863] parallel_sendData(master, data) [15:31:57.863] } [15:31:57.863] return(sendCondition) [15:31:57.863] } [15:31:57.863] } [15:31:57.863] frame <- frame + 1L [15:31:57.863] envir <- sys.frame(frame) [15:31:57.863] } [15:31:57.863] } [15:31:57.863] sendCondition <<- function(cond) NULL [15:31:57.863] } [15:31:57.863] }) [15:31:57.863] withCallingHandlers({ [15:31:57.863] { [15:31:57.863] do.call(function(...) { [15:31:57.863] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.863] if (!identical(...future.globals.maxSize.org, [15:31:57.863] ...future.globals.maxSize)) { [15:31:57.863] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.863] on.exit(options(oopts), add = TRUE) [15:31:57.863] } [15:31:57.863] { [15:31:57.863] lapply(seq_along(...future.elements_ii), [15:31:57.863] FUN = function(jj) { [15:31:57.863] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.863] ...future.FUN(...future.X_jj, ...) [15:31:57.863] }) [15:31:57.863] } [15:31:57.863] }, args = future.call.arguments) [15:31:57.863] } [15:31:57.863] }, immediateCondition = function(cond) { [15:31:57.863] sendCondition <- ...future.makeSendCondition() [15:31:57.863] sendCondition(cond) [15:31:57.863] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.863] { [15:31:57.863] inherits <- base::inherits [15:31:57.863] invokeRestart <- base::invokeRestart [15:31:57.863] is.null <- base::is.null [15:31:57.863] muffled <- FALSE [15:31:57.863] if (inherits(cond, "message")) { [15:31:57.863] muffled <- grepl(pattern, "muffleMessage") [15:31:57.863] if (muffled) [15:31:57.863] invokeRestart("muffleMessage") [15:31:57.863] } [15:31:57.863] else if (inherits(cond, "warning")) { [15:31:57.863] muffled <- grepl(pattern, "muffleWarning") [15:31:57.863] if (muffled) [15:31:57.863] invokeRestart("muffleWarning") [15:31:57.863] } [15:31:57.863] else if (inherits(cond, "condition")) { [15:31:57.863] if (!is.null(pattern)) { [15:31:57.863] computeRestarts <- base::computeRestarts [15:31:57.863] grepl <- base::grepl [15:31:57.863] restarts <- computeRestarts(cond) [15:31:57.863] for (restart in restarts) { [15:31:57.863] name <- restart$name [15:31:57.863] if (is.null(name)) [15:31:57.863] next [15:31:57.863] if (!grepl(pattern, name)) [15:31:57.863] next [15:31:57.863] invokeRestart(restart) [15:31:57.863] muffled <- TRUE [15:31:57.863] break [15:31:57.863] } [15:31:57.863] } [15:31:57.863] } [15:31:57.863] invisible(muffled) [15:31:57.863] } [15:31:57.863] muffleCondition(cond) [15:31:57.863] }) [15:31:57.863] })) [15:31:57.863] future::FutureResult(value = ...future.value$value, [15:31:57.863] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:57.863] ...future.rng), globalenv = if (FALSE) [15:31:57.863] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:57.863] ...future.globalenv.names)) [15:31:57.863] else NULL, started = ...future.startTime, version = "1.8") [15:31:57.863] }, condition = base::local({ [15:31:57.863] c <- base::c [15:31:57.863] inherits <- base::inherits [15:31:57.863] invokeRestart <- base::invokeRestart [15:31:57.863] length <- base::length [15:31:57.863] list <- base::list [15:31:57.863] seq.int <- base::seq.int [15:31:57.863] signalCondition <- base::signalCondition [15:31:57.863] sys.calls <- base::sys.calls [15:31:57.863] `[[` <- base::`[[` [15:31:57.863] `+` <- base::`+` [15:31:57.863] `<<-` <- base::`<<-` [15:31:57.863] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:57.863] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:57.863] 3L)] [15:31:57.863] } [15:31:57.863] function(cond) { [15:31:57.863] is_error <- inherits(cond, "error") [15:31:57.863] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:57.863] NULL) [15:31:57.863] if (is_error) { [15:31:57.863] sessionInformation <- function() { [15:31:57.863] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:57.863] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:57.863] search = base::search(), system = base::Sys.info()) [15:31:57.863] } [15:31:57.863] ...future.conditions[[length(...future.conditions) + [15:31:57.863] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:57.863] cond$call), session = sessionInformation(), [15:31:57.863] timestamp = base::Sys.time(), signaled = 0L) [15:31:57.863] signalCondition(cond) [15:31:57.863] } [15:31:57.863] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:57.863] "immediateCondition"))) { [15:31:57.863] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:57.863] ...future.conditions[[length(...future.conditions) + [15:31:57.863] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:57.863] if (TRUE && !signal) { [15:31:57.863] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.863] { [15:31:57.863] inherits <- base::inherits [15:31:57.863] invokeRestart <- base::invokeRestart [15:31:57.863] is.null <- base::is.null [15:31:57.863] muffled <- FALSE [15:31:57.863] if (inherits(cond, "message")) { [15:31:57.863] muffled <- grepl(pattern, "muffleMessage") [15:31:57.863] if (muffled) [15:31:57.863] invokeRestart("muffleMessage") [15:31:57.863] } [15:31:57.863] else if (inherits(cond, "warning")) { [15:31:57.863] muffled <- grepl(pattern, "muffleWarning") [15:31:57.863] if (muffled) [15:31:57.863] invokeRestart("muffleWarning") [15:31:57.863] } [15:31:57.863] else if (inherits(cond, "condition")) { [15:31:57.863] if (!is.null(pattern)) { [15:31:57.863] computeRestarts <- base::computeRestarts [15:31:57.863] grepl <- base::grepl [15:31:57.863] restarts <- computeRestarts(cond) [15:31:57.863] for (restart in restarts) { [15:31:57.863] name <- restart$name [15:31:57.863] if (is.null(name)) [15:31:57.863] next [15:31:57.863] if (!grepl(pattern, name)) [15:31:57.863] next [15:31:57.863] invokeRestart(restart) [15:31:57.863] muffled <- TRUE [15:31:57.863] break [15:31:57.863] } [15:31:57.863] } [15:31:57.863] } [15:31:57.863] invisible(muffled) [15:31:57.863] } [15:31:57.863] muffleCondition(cond, pattern = "^muffle") [15:31:57.863] } [15:31:57.863] } [15:31:57.863] else { [15:31:57.863] if (TRUE) { [15:31:57.863] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.863] { [15:31:57.863] inherits <- base::inherits [15:31:57.863] invokeRestart <- base::invokeRestart [15:31:57.863] is.null <- base::is.null [15:31:57.863] muffled <- FALSE [15:31:57.863] if (inherits(cond, "message")) { [15:31:57.863] muffled <- grepl(pattern, "muffleMessage") [15:31:57.863] if (muffled) [15:31:57.863] invokeRestart("muffleMessage") [15:31:57.863] } [15:31:57.863] else if (inherits(cond, "warning")) { [15:31:57.863] muffled <- grepl(pattern, "muffleWarning") [15:31:57.863] if (muffled) [15:31:57.863] invokeRestart("muffleWarning") [15:31:57.863] } [15:31:57.863] else if (inherits(cond, "condition")) { [15:31:57.863] if (!is.null(pattern)) { [15:31:57.863] computeRestarts <- base::computeRestarts [15:31:57.863] grepl <- base::grepl [15:31:57.863] restarts <- computeRestarts(cond) [15:31:57.863] for (restart in restarts) { [15:31:57.863] name <- restart$name [15:31:57.863] if (is.null(name)) [15:31:57.863] next [15:31:57.863] if (!grepl(pattern, name)) [15:31:57.863] next [15:31:57.863] invokeRestart(restart) [15:31:57.863] muffled <- TRUE [15:31:57.863] break [15:31:57.863] } [15:31:57.863] } [15:31:57.863] } [15:31:57.863] invisible(muffled) [15:31:57.863] } [15:31:57.863] muffleCondition(cond, pattern = "^muffle") [15:31:57.863] } [15:31:57.863] } [15:31:57.863] } [15:31:57.863] })) [15:31:57.863] }, error = function(ex) { [15:31:57.863] base::structure(base::list(value = NULL, visible = NULL, [15:31:57.863] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:57.863] ...future.rng), started = ...future.startTime, [15:31:57.863] finished = Sys.time(), session_uuid = NA_character_, [15:31:57.863] version = "1.8"), class = "FutureResult") [15:31:57.863] }, finally = { [15:31:57.863] if (!identical(...future.workdir, getwd())) [15:31:57.863] setwd(...future.workdir) [15:31:57.863] { [15:31:57.863] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:57.863] ...future.oldOptions$nwarnings <- NULL [15:31:57.863] } [15:31:57.863] base::options(...future.oldOptions) [15:31:57.863] if (.Platform$OS.type == "windows") { [15:31:57.863] old_names <- names(...future.oldEnvVars) [15:31:57.863] envs <- base::Sys.getenv() [15:31:57.863] names <- names(envs) [15:31:57.863] common <- intersect(names, old_names) [15:31:57.863] added <- setdiff(names, old_names) [15:31:57.863] removed <- setdiff(old_names, names) [15:31:57.863] changed <- common[...future.oldEnvVars[common] != [15:31:57.863] envs[common]] [15:31:57.863] NAMES <- toupper(changed) [15:31:57.863] args <- list() [15:31:57.863] for (kk in seq_along(NAMES)) { [15:31:57.863] name <- changed[[kk]] [15:31:57.863] NAME <- NAMES[[kk]] [15:31:57.863] if (name != NAME && is.element(NAME, old_names)) [15:31:57.863] next [15:31:57.863] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:57.863] } [15:31:57.863] NAMES <- toupper(added) [15:31:57.863] for (kk in seq_along(NAMES)) { [15:31:57.863] name <- added[[kk]] [15:31:57.863] NAME <- NAMES[[kk]] [15:31:57.863] if (name != NAME && is.element(NAME, old_names)) [15:31:57.863] next [15:31:57.863] args[[name]] <- "" [15:31:57.863] } [15:31:57.863] NAMES <- toupper(removed) [15:31:57.863] for (kk in seq_along(NAMES)) { [15:31:57.863] name <- removed[[kk]] [15:31:57.863] NAME <- NAMES[[kk]] [15:31:57.863] if (name != NAME && is.element(NAME, old_names)) [15:31:57.863] next [15:31:57.863] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:57.863] } [15:31:57.863] if (length(args) > 0) [15:31:57.863] base::do.call(base::Sys.setenv, args = args) [15:31:57.863] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:57.863] } [15:31:57.863] else { [15:31:57.863] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:57.863] } [15:31:57.863] { [15:31:57.863] if (base::length(...future.futureOptionsAdded) > [15:31:57.863] 0L) { [15:31:57.863] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:57.863] base::names(opts) <- ...future.futureOptionsAdded [15:31:57.863] base::options(opts) [15:31:57.863] } [15:31:57.863] { [15:31:57.863] { [15:31:57.863] base::options(mc.cores = ...future.mc.cores.old) [15:31:57.863] NULL [15:31:57.863] } [15:31:57.863] options(future.plan = NULL) [15:31:57.863] if (is.na(NA_character_)) [15:31:57.863] Sys.unsetenv("R_FUTURE_PLAN") [15:31:57.863] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:57.863] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:57.863] .init = FALSE) [15:31:57.863] } [15:31:57.863] } [15:31:57.863] } [15:31:57.863] }) [15:31:57.863] if (TRUE) { [15:31:57.863] base::sink(type = "output", split = FALSE) [15:31:57.863] if (TRUE) { [15:31:57.863] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:57.863] } [15:31:57.863] else { [15:31:57.863] ...future.result["stdout"] <- base::list(NULL) [15:31:57.863] } [15:31:57.863] base::close(...future.stdout) [15:31:57.863] ...future.stdout <- NULL [15:31:57.863] } [15:31:57.863] ...future.result$conditions <- ...future.conditions [15:31:57.863] ...future.result$finished <- base::Sys.time() [15:31:57.863] ...future.result [15:31:57.863] } [15:31:57.869] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:57.869] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:57.870] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:57.870] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:57.871] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:57.871] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... [15:31:57.871] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... DONE [15:31:57.872] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:57.872] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:57.872] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:57.873] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:57.873] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:57.874] MultisessionFuture started [15:31:57.874] - Launch lazy future ... done [15:31:57.874] run() for 'MultisessionFuture' ... done [15:31:57.874] Created future: [15:31:57.900] receiveMessageFromWorker() for ClusterFuture ... [15:31:57.900] - Validating connection of MultisessionFuture [15:31:57.901] - received message: FutureResult [15:31:57.901] - Received FutureResult [15:31:57.901] - Erased future from FutureRegistry [15:31:57.901] result() for ClusterFuture ... [15:31:57.902] - result already collected: FutureResult [15:31:57.902] result() for ClusterFuture ... done [15:31:57.902] receiveMessageFromWorker() for ClusterFuture ... done [15:31:57.874] MultisessionFuture: [15:31:57.874] Label: 'future_lapply-1' [15:31:57.874] Expression: [15:31:57.874] { [15:31:57.874] do.call(function(...) { [15:31:57.874] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.874] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:57.874] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.874] on.exit(options(oopts), add = TRUE) [15:31:57.874] } [15:31:57.874] { [15:31:57.874] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:57.874] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.874] ...future.FUN(...future.X_jj, ...) [15:31:57.874] }) [15:31:57.874] } [15:31:57.874] }, args = future.call.arguments) [15:31:57.874] } [15:31:57.874] Lazy evaluation: FALSE [15:31:57.874] Asynchronous evaluation: TRUE [15:31:57.874] Local evaluation: TRUE [15:31:57.874] Environment: R_GlobalEnv [15:31:57.874] Capture standard output: TRUE [15:31:57.874] Capture condition classes: 'condition' (excluding 'nothing') [15:31:57.874] Globals: 5 objects totaling 2.41 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 224 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:57.874] Packages: [15:31:57.874] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:57.874] Resolved: TRUE [15:31:57.874] Value: [15:31:57.874] Conditions captured: [15:31:57.874] Early signaling: FALSE [15:31:57.874] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:57.874] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:57.902] Chunk #1 of 2 ... DONE [15:31:57.903] Chunk #2 of 2 ... [15:31:57.903] - Finding globals in 'X' for chunk #2 ... [15:31:57.903] getGlobalsAndPackages() ... [15:31:57.903] Searching for globals... [15:31:57.904] [15:31:57.904] Searching for globals ... DONE [15:31:57.904] - globals: [0] [15:31:57.904] getGlobalsAndPackages() ... DONE [15:31:57.904] + additional globals found: [n=0] [15:31:57.905] + additional namespaces needed: [n=0] [15:31:57.905] - Finding globals in 'X' for chunk #2 ... DONE [15:31:57.905] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:57.905] - seeds: [15:31:57.905] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.906] getGlobalsAndPackages() ... [15:31:57.906] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.906] Resolving globals: FALSE [15:31:57.906] Tweak future expression to call with '...' arguments ... [15:31:57.906] { [15:31:57.906] do.call(function(...) { [15:31:57.906] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.906] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:57.906] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.906] on.exit(options(oopts), add = TRUE) [15:31:57.906] } [15:31:57.906] { [15:31:57.906] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:57.906] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.906] ...future.FUN(...future.X_jj, ...) [15:31:57.906] }) [15:31:57.906] } [15:31:57.906] }, args = future.call.arguments) [15:31:57.906] } [15:31:57.907] Tweak future expression to call with '...' arguments ... DONE [15:31:57.908] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:57.908] [15:31:57.908] getGlobalsAndPackages() ... DONE [15:31:57.909] run() for 'Future' ... [15:31:57.909] - state: 'created' [15:31:57.909] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:57.925] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:57.925] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:57.926] - Field: 'node' [15:31:57.926] - Field: 'label' [15:31:57.926] - Field: 'local' [15:31:57.926] - Field: 'owner' [15:31:57.926] - Field: 'envir' [15:31:57.927] - Field: 'workers' [15:31:57.927] - Field: 'packages' [15:31:57.927] - Field: 'gc' [15:31:57.927] - Field: 'conditions' [15:31:57.927] - Field: 'persistent' [15:31:57.928] - Field: 'expr' [15:31:57.928] - Field: 'uuid' [15:31:57.928] - Field: 'seed' [15:31:57.928] - Field: 'version' [15:31:57.928] - Field: 'result' [15:31:57.929] - Field: 'asynchronous' [15:31:57.929] - Field: 'calls' [15:31:57.929] - Field: 'globals' [15:31:57.929] - Field: 'stdout' [15:31:57.929] - Field: 'earlySignal' [15:31:57.930] - Field: 'lazy' [15:31:57.930] - Field: 'state' [15:31:57.930] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:57.930] - Launch lazy future ... [15:31:57.931] Packages needed by the future expression (n = 0): [15:31:57.931] Packages needed by future strategies (n = 0): [15:31:57.932] { [15:31:57.932] { [15:31:57.932] { [15:31:57.932] ...future.startTime <- base::Sys.time() [15:31:57.932] { [15:31:57.932] { [15:31:57.932] { [15:31:57.932] { [15:31:57.932] base::local({ [15:31:57.932] has_future <- base::requireNamespace("future", [15:31:57.932] quietly = TRUE) [15:31:57.932] if (has_future) { [15:31:57.932] ns <- base::getNamespace("future") [15:31:57.932] version <- ns[[".package"]][["version"]] [15:31:57.932] if (is.null(version)) [15:31:57.932] version <- utils::packageVersion("future") [15:31:57.932] } [15:31:57.932] else { [15:31:57.932] version <- NULL [15:31:57.932] } [15:31:57.932] if (!has_future || version < "1.8.0") { [15:31:57.932] info <- base::c(r_version = base::gsub("R version ", [15:31:57.932] "", base::R.version$version.string), [15:31:57.932] platform = base::sprintf("%s (%s-bit)", [15:31:57.932] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:57.932] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:57.932] "release", "version")], collapse = " "), [15:31:57.932] hostname = base::Sys.info()[["nodename"]]) [15:31:57.932] info <- base::sprintf("%s: %s", base::names(info), [15:31:57.932] info) [15:31:57.932] info <- base::paste(info, collapse = "; ") [15:31:57.932] if (!has_future) { [15:31:57.932] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:57.932] info) [15:31:57.932] } [15:31:57.932] else { [15:31:57.932] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:57.932] info, version) [15:31:57.932] } [15:31:57.932] base::stop(msg) [15:31:57.932] } [15:31:57.932] }) [15:31:57.932] } [15:31:57.932] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:57.932] base::options(mc.cores = 1L) [15:31:57.932] } [15:31:57.932] ...future.strategy.old <- future::plan("list") [15:31:57.932] options(future.plan = NULL) [15:31:57.932] Sys.unsetenv("R_FUTURE_PLAN") [15:31:57.932] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:57.932] } [15:31:57.932] ...future.workdir <- getwd() [15:31:57.932] } [15:31:57.932] ...future.oldOptions <- base::as.list(base::.Options) [15:31:57.932] ...future.oldEnvVars <- base::Sys.getenv() [15:31:57.932] } [15:31:57.932] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:57.932] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:57.932] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:57.932] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:57.932] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:57.932] future.stdout.windows.reencode = NULL, width = 80L) [15:31:57.932] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:57.932] base::names(...future.oldOptions)) [15:31:57.932] } [15:31:57.932] if (FALSE) { [15:31:57.932] } [15:31:57.932] else { [15:31:57.932] if (TRUE) { [15:31:57.932] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:57.932] open = "w") [15:31:57.932] } [15:31:57.932] else { [15:31:57.932] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:57.932] windows = "NUL", "/dev/null"), open = "w") [15:31:57.932] } [15:31:57.932] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:57.932] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:57.932] base::sink(type = "output", split = FALSE) [15:31:57.932] base::close(...future.stdout) [15:31:57.932] }, add = TRUE) [15:31:57.932] } [15:31:57.932] ...future.frame <- base::sys.nframe() [15:31:57.932] ...future.conditions <- base::list() [15:31:57.932] ...future.rng <- base::globalenv()$.Random.seed [15:31:57.932] if (FALSE) { [15:31:57.932] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:57.932] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:57.932] } [15:31:57.932] ...future.result <- base::tryCatch({ [15:31:57.932] base::withCallingHandlers({ [15:31:57.932] ...future.value <- base::withVisible(base::local({ [15:31:57.932] ...future.makeSendCondition <- base::local({ [15:31:57.932] sendCondition <- NULL [15:31:57.932] function(frame = 1L) { [15:31:57.932] if (is.function(sendCondition)) [15:31:57.932] return(sendCondition) [15:31:57.932] ns <- getNamespace("parallel") [15:31:57.932] if (exists("sendData", mode = "function", [15:31:57.932] envir = ns)) { [15:31:57.932] parallel_sendData <- get("sendData", mode = "function", [15:31:57.932] envir = ns) [15:31:57.932] envir <- sys.frame(frame) [15:31:57.932] master <- NULL [15:31:57.932] while (!identical(envir, .GlobalEnv) && [15:31:57.932] !identical(envir, emptyenv())) { [15:31:57.932] if (exists("master", mode = "list", envir = envir, [15:31:57.932] inherits = FALSE)) { [15:31:57.932] master <- get("master", mode = "list", [15:31:57.932] envir = envir, inherits = FALSE) [15:31:57.932] if (inherits(master, c("SOCKnode", [15:31:57.932] "SOCK0node"))) { [15:31:57.932] sendCondition <<- function(cond) { [15:31:57.932] data <- list(type = "VALUE", value = cond, [15:31:57.932] success = TRUE) [15:31:57.932] parallel_sendData(master, data) [15:31:57.932] } [15:31:57.932] return(sendCondition) [15:31:57.932] } [15:31:57.932] } [15:31:57.932] frame <- frame + 1L [15:31:57.932] envir <- sys.frame(frame) [15:31:57.932] } [15:31:57.932] } [15:31:57.932] sendCondition <<- function(cond) NULL [15:31:57.932] } [15:31:57.932] }) [15:31:57.932] withCallingHandlers({ [15:31:57.932] { [15:31:57.932] do.call(function(...) { [15:31:57.932] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.932] if (!identical(...future.globals.maxSize.org, [15:31:57.932] ...future.globals.maxSize)) { [15:31:57.932] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.932] on.exit(options(oopts), add = TRUE) [15:31:57.932] } [15:31:57.932] { [15:31:57.932] lapply(seq_along(...future.elements_ii), [15:31:57.932] FUN = function(jj) { [15:31:57.932] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.932] ...future.FUN(...future.X_jj, ...) [15:31:57.932] }) [15:31:57.932] } [15:31:57.932] }, args = future.call.arguments) [15:31:57.932] } [15:31:57.932] }, immediateCondition = function(cond) { [15:31:57.932] sendCondition <- ...future.makeSendCondition() [15:31:57.932] sendCondition(cond) [15:31:57.932] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.932] { [15:31:57.932] inherits <- base::inherits [15:31:57.932] invokeRestart <- base::invokeRestart [15:31:57.932] is.null <- base::is.null [15:31:57.932] muffled <- FALSE [15:31:57.932] if (inherits(cond, "message")) { [15:31:57.932] muffled <- grepl(pattern, "muffleMessage") [15:31:57.932] if (muffled) [15:31:57.932] invokeRestart("muffleMessage") [15:31:57.932] } [15:31:57.932] else if (inherits(cond, "warning")) { [15:31:57.932] muffled <- grepl(pattern, "muffleWarning") [15:31:57.932] if (muffled) [15:31:57.932] invokeRestart("muffleWarning") [15:31:57.932] } [15:31:57.932] else if (inherits(cond, "condition")) { [15:31:57.932] if (!is.null(pattern)) { [15:31:57.932] computeRestarts <- base::computeRestarts [15:31:57.932] grepl <- base::grepl [15:31:57.932] restarts <- computeRestarts(cond) [15:31:57.932] for (restart in restarts) { [15:31:57.932] name <- restart$name [15:31:57.932] if (is.null(name)) [15:31:57.932] next [15:31:57.932] if (!grepl(pattern, name)) [15:31:57.932] next [15:31:57.932] invokeRestart(restart) [15:31:57.932] muffled <- TRUE [15:31:57.932] break [15:31:57.932] } [15:31:57.932] } [15:31:57.932] } [15:31:57.932] invisible(muffled) [15:31:57.932] } [15:31:57.932] muffleCondition(cond) [15:31:57.932] }) [15:31:57.932] })) [15:31:57.932] future::FutureResult(value = ...future.value$value, [15:31:57.932] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:57.932] ...future.rng), globalenv = if (FALSE) [15:31:57.932] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:57.932] ...future.globalenv.names)) [15:31:57.932] else NULL, started = ...future.startTime, version = "1.8") [15:31:57.932] }, condition = base::local({ [15:31:57.932] c <- base::c [15:31:57.932] inherits <- base::inherits [15:31:57.932] invokeRestart <- base::invokeRestart [15:31:57.932] length <- base::length [15:31:57.932] list <- base::list [15:31:57.932] seq.int <- base::seq.int [15:31:57.932] signalCondition <- base::signalCondition [15:31:57.932] sys.calls <- base::sys.calls [15:31:57.932] `[[` <- base::`[[` [15:31:57.932] `+` <- base::`+` [15:31:57.932] `<<-` <- base::`<<-` [15:31:57.932] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:57.932] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:57.932] 3L)] [15:31:57.932] } [15:31:57.932] function(cond) { [15:31:57.932] is_error <- inherits(cond, "error") [15:31:57.932] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:57.932] NULL) [15:31:57.932] if (is_error) { [15:31:57.932] sessionInformation <- function() { [15:31:57.932] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:57.932] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:57.932] search = base::search(), system = base::Sys.info()) [15:31:57.932] } [15:31:57.932] ...future.conditions[[length(...future.conditions) + [15:31:57.932] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:57.932] cond$call), session = sessionInformation(), [15:31:57.932] timestamp = base::Sys.time(), signaled = 0L) [15:31:57.932] signalCondition(cond) [15:31:57.932] } [15:31:57.932] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:57.932] "immediateCondition"))) { [15:31:57.932] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:57.932] ...future.conditions[[length(...future.conditions) + [15:31:57.932] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:57.932] if (TRUE && !signal) { [15:31:57.932] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.932] { [15:31:57.932] inherits <- base::inherits [15:31:57.932] invokeRestart <- base::invokeRestart [15:31:57.932] is.null <- base::is.null [15:31:57.932] muffled <- FALSE [15:31:57.932] if (inherits(cond, "message")) { [15:31:57.932] muffled <- grepl(pattern, "muffleMessage") [15:31:57.932] if (muffled) [15:31:57.932] invokeRestart("muffleMessage") [15:31:57.932] } [15:31:57.932] else if (inherits(cond, "warning")) { [15:31:57.932] muffled <- grepl(pattern, "muffleWarning") [15:31:57.932] if (muffled) [15:31:57.932] invokeRestart("muffleWarning") [15:31:57.932] } [15:31:57.932] else if (inherits(cond, "condition")) { [15:31:57.932] if (!is.null(pattern)) { [15:31:57.932] computeRestarts <- base::computeRestarts [15:31:57.932] grepl <- base::grepl [15:31:57.932] restarts <- computeRestarts(cond) [15:31:57.932] for (restart in restarts) { [15:31:57.932] name <- restart$name [15:31:57.932] if (is.null(name)) [15:31:57.932] next [15:31:57.932] if (!grepl(pattern, name)) [15:31:57.932] next [15:31:57.932] invokeRestart(restart) [15:31:57.932] muffled <- TRUE [15:31:57.932] break [15:31:57.932] } [15:31:57.932] } [15:31:57.932] } [15:31:57.932] invisible(muffled) [15:31:57.932] } [15:31:57.932] muffleCondition(cond, pattern = "^muffle") [15:31:57.932] } [15:31:57.932] } [15:31:57.932] else { [15:31:57.932] if (TRUE) { [15:31:57.932] muffleCondition <- function (cond, pattern = "^muffle") [15:31:57.932] { [15:31:57.932] inherits <- base::inherits [15:31:57.932] invokeRestart <- base::invokeRestart [15:31:57.932] is.null <- base::is.null [15:31:57.932] muffled <- FALSE [15:31:57.932] if (inherits(cond, "message")) { [15:31:57.932] muffled <- grepl(pattern, "muffleMessage") [15:31:57.932] if (muffled) [15:31:57.932] invokeRestart("muffleMessage") [15:31:57.932] } [15:31:57.932] else if (inherits(cond, "warning")) { [15:31:57.932] muffled <- grepl(pattern, "muffleWarning") [15:31:57.932] if (muffled) [15:31:57.932] invokeRestart("muffleWarning") [15:31:57.932] } [15:31:57.932] else if (inherits(cond, "condition")) { [15:31:57.932] if (!is.null(pattern)) { [15:31:57.932] computeRestarts <- base::computeRestarts [15:31:57.932] grepl <- base::grepl [15:31:57.932] restarts <- computeRestarts(cond) [15:31:57.932] for (restart in restarts) { [15:31:57.932] name <- restart$name [15:31:57.932] if (is.null(name)) [15:31:57.932] next [15:31:57.932] if (!grepl(pattern, name)) [15:31:57.932] next [15:31:57.932] invokeRestart(restart) [15:31:57.932] muffled <- TRUE [15:31:57.932] break [15:31:57.932] } [15:31:57.932] } [15:31:57.932] } [15:31:57.932] invisible(muffled) [15:31:57.932] } [15:31:57.932] muffleCondition(cond, pattern = "^muffle") [15:31:57.932] } [15:31:57.932] } [15:31:57.932] } [15:31:57.932] })) [15:31:57.932] }, error = function(ex) { [15:31:57.932] base::structure(base::list(value = NULL, visible = NULL, [15:31:57.932] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:57.932] ...future.rng), started = ...future.startTime, [15:31:57.932] finished = Sys.time(), session_uuid = NA_character_, [15:31:57.932] version = "1.8"), class = "FutureResult") [15:31:57.932] }, finally = { [15:31:57.932] if (!identical(...future.workdir, getwd())) [15:31:57.932] setwd(...future.workdir) [15:31:57.932] { [15:31:57.932] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:57.932] ...future.oldOptions$nwarnings <- NULL [15:31:57.932] } [15:31:57.932] base::options(...future.oldOptions) [15:31:57.932] if (.Platform$OS.type == "windows") { [15:31:57.932] old_names <- names(...future.oldEnvVars) [15:31:57.932] envs <- base::Sys.getenv() [15:31:57.932] names <- names(envs) [15:31:57.932] common <- intersect(names, old_names) [15:31:57.932] added <- setdiff(names, old_names) [15:31:57.932] removed <- setdiff(old_names, names) [15:31:57.932] changed <- common[...future.oldEnvVars[common] != [15:31:57.932] envs[common]] [15:31:57.932] NAMES <- toupper(changed) [15:31:57.932] args <- list() [15:31:57.932] for (kk in seq_along(NAMES)) { [15:31:57.932] name <- changed[[kk]] [15:31:57.932] NAME <- NAMES[[kk]] [15:31:57.932] if (name != NAME && is.element(NAME, old_names)) [15:31:57.932] next [15:31:57.932] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:57.932] } [15:31:57.932] NAMES <- toupper(added) [15:31:57.932] for (kk in seq_along(NAMES)) { [15:31:57.932] name <- added[[kk]] [15:31:57.932] NAME <- NAMES[[kk]] [15:31:57.932] if (name != NAME && is.element(NAME, old_names)) [15:31:57.932] next [15:31:57.932] args[[name]] <- "" [15:31:57.932] } [15:31:57.932] NAMES <- toupper(removed) [15:31:57.932] for (kk in seq_along(NAMES)) { [15:31:57.932] name <- removed[[kk]] [15:31:57.932] NAME <- NAMES[[kk]] [15:31:57.932] if (name != NAME && is.element(NAME, old_names)) [15:31:57.932] next [15:31:57.932] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:57.932] } [15:31:57.932] if (length(args) > 0) [15:31:57.932] base::do.call(base::Sys.setenv, args = args) [15:31:57.932] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:57.932] } [15:31:57.932] else { [15:31:57.932] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:57.932] } [15:31:57.932] { [15:31:57.932] if (base::length(...future.futureOptionsAdded) > [15:31:57.932] 0L) { [15:31:57.932] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:57.932] base::names(opts) <- ...future.futureOptionsAdded [15:31:57.932] base::options(opts) [15:31:57.932] } [15:31:57.932] { [15:31:57.932] { [15:31:57.932] base::options(mc.cores = ...future.mc.cores.old) [15:31:57.932] NULL [15:31:57.932] } [15:31:57.932] options(future.plan = NULL) [15:31:57.932] if (is.na(NA_character_)) [15:31:57.932] Sys.unsetenv("R_FUTURE_PLAN") [15:31:57.932] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:57.932] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:57.932] .init = FALSE) [15:31:57.932] } [15:31:57.932] } [15:31:57.932] } [15:31:57.932] }) [15:31:57.932] if (TRUE) { [15:31:57.932] base::sink(type = "output", split = FALSE) [15:31:57.932] if (TRUE) { [15:31:57.932] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:57.932] } [15:31:57.932] else { [15:31:57.932] ...future.result["stdout"] <- base::list(NULL) [15:31:57.932] } [15:31:57.932] base::close(...future.stdout) [15:31:57.932] ...future.stdout <- NULL [15:31:57.932] } [15:31:57.932] ...future.result$conditions <- ...future.conditions [15:31:57.932] ...future.result$finished <- base::Sys.time() [15:31:57.932] ...future.result [15:31:57.932] } [15:31:57.938] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:57.938] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:57.939] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:57.940] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:57.940] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:57.940] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... [15:31:57.941] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... DONE [15:31:57.941] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:57.942] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:57.942] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:57.942] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:57.942] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:57.943] MultisessionFuture started [15:31:57.943] - Launch lazy future ... done [15:31:57.944] run() for 'MultisessionFuture' ... done [15:31:57.944] Created future: [15:31:57.972] receiveMessageFromWorker() for ClusterFuture ... [15:31:57.972] - Validating connection of MultisessionFuture [15:31:57.973] - received message: FutureResult [15:31:57.973] - Received FutureResult [15:31:57.973] - Erased future from FutureRegistry [15:31:57.974] result() for ClusterFuture ... [15:31:57.974] - result already collected: FutureResult [15:31:57.974] result() for ClusterFuture ... done [15:31:57.975] receiveMessageFromWorker() for ClusterFuture ... done [15:31:57.944] MultisessionFuture: [15:31:57.944] Label: 'future_lapply-2' [15:31:57.944] Expression: [15:31:57.944] { [15:31:57.944] do.call(function(...) { [15:31:57.944] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:57.944] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:57.944] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:57.944] on.exit(options(oopts), add = TRUE) [15:31:57.944] } [15:31:57.944] { [15:31:57.944] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:57.944] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:57.944] ...future.FUN(...future.X_jj, ...) [15:31:57.944] }) [15:31:57.944] } [15:31:57.944] }, args = future.call.arguments) [15:31:57.944] } [15:31:57.944] Lazy evaluation: FALSE [15:31:57.944] Asynchronous evaluation: TRUE [15:31:57.944] Local evaluation: TRUE [15:31:57.944] Environment: R_GlobalEnv [15:31:57.944] Capture standard output: TRUE [15:31:57.944] Capture condition classes: 'condition' (excluding 'nothing') [15:31:57.944] Globals: 5 objects totaling 2.41 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 232 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:57.944] Packages: [15:31:57.944] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:57.944] Resolved: TRUE [15:31:57.944] Value: [15:31:57.944] Conditions captured: [15:31:57.944] Early signaling: FALSE [15:31:57.944] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:57.944] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:57.975] Chunk #2 of 2 ... DONE [15:31:57.976] Launching 2 futures (chunks) ... DONE [15:31:57.976] Resolving 2 futures (chunks) ... [15:31:57.976] resolve() on list ... [15:31:57.977] recursive: 0 [15:31:57.977] length: 2 [15:31:57.977] [15:31:57.977] Future #1 [15:31:57.978] result() for ClusterFuture ... [15:31:57.978] - result already collected: FutureResult [15:31:57.978] result() for ClusterFuture ... done [15:31:57.979] result() for ClusterFuture ... [15:31:57.979] - result already collected: FutureResult [15:31:57.979] result() for ClusterFuture ... done [15:31:57.979] signalConditionsASAP(MultisessionFuture, pos=1) ... [15:31:57.980] - nx: 2 [15:31:57.980] - relay: TRUE [15:31:57.980] - stdout: TRUE [15:31:57.980] - signal: TRUE [15:31:57.981] - resignal: FALSE [15:31:57.981] - force: TRUE [15:31:57.981] - relayed: [n=2] FALSE, FALSE [15:31:57.981] - queued futures: [n=2] FALSE, FALSE [15:31:57.982] - until=1 [15:31:57.982] - relaying element #1 [15:31:57.982] result() for ClusterFuture ... [15:31:57.983] - result already collected: FutureResult [15:31:57.983] result() for ClusterFuture ... done [15:31:57.983] result() for ClusterFuture ... [15:31:57.983] - result already collected: FutureResult [15:31:57.984] result() for ClusterFuture ... done [15:31:57.984] result() for ClusterFuture ... [15:31:57.984] - result already collected: FutureResult [15:31:57.985] result() for ClusterFuture ... done [15:31:57.985] result() for ClusterFuture ... [15:31:57.985] - result already collected: FutureResult [15:31:57.985] result() for ClusterFuture ... done [15:31:57.986] - relayed: [n=2] TRUE, FALSE [15:31:57.986] - queued futures: [n=2] TRUE, FALSE [15:31:57.986] signalConditionsASAP(MultisessionFuture, pos=1) ... done [15:31:57.986] length: 1 (resolved future 1) [15:31:57.987] Future #2 [15:31:57.987] result() for ClusterFuture ... [15:31:57.987] - result already collected: FutureResult [15:31:57.987] result() for ClusterFuture ... done [15:31:57.988] result() for ClusterFuture ... [15:31:57.988] - result already collected: FutureResult [15:31:57.988] result() for ClusterFuture ... done [15:31:57.988] signalConditionsASAP(MultisessionFuture, pos=2) ... [15:31:57.989] - nx: 2 [15:31:57.989] - relay: TRUE [15:31:57.989] - stdout: TRUE [15:31:57.989] - signal: TRUE [15:31:57.990] - resignal: FALSE [15:31:57.990] - force: TRUE [15:31:57.990] - relayed: [n=2] TRUE, FALSE [15:31:57.990] - queued futures: [n=2] TRUE, FALSE [15:31:57.991] - until=2 [15:31:57.991] - relaying element #2 [15:31:57.991] result() for ClusterFuture ... [15:31:57.991] - result already collected: FutureResult [15:31:57.991] result() for ClusterFuture ... done [15:31:57.992] result() for ClusterFuture ... [15:31:57.992] - result already collected: FutureResult [15:31:57.992] result() for ClusterFuture ... done [15:31:57.992] result() for ClusterFuture ... [15:31:57.993] - result already collected: FutureResult [15:31:57.993] result() for ClusterFuture ... done [15:31:57.993] result() for ClusterFuture ... [15:31:57.993] - result already collected: FutureResult [15:31:57.994] result() for ClusterFuture ... done [15:31:57.994] - relayed: [n=2] TRUE, TRUE [15:31:57.994] - queued futures: [n=2] TRUE, TRUE [15:31:57.994] signalConditionsASAP(MultisessionFuture, pos=2) ... done [15:31:57.995] length: 0 (resolved future 2) [15:31:57.995] Relaying remaining futures [15:31:57.995] signalConditionsASAP(NULL, pos=0) ... [15:31:57.995] - nx: 2 [15:31:57.996] - relay: TRUE [15:31:57.996] - stdout: TRUE [15:31:57.996] - signal: TRUE [15:31:57.996] - resignal: FALSE [15:31:57.996] - force: TRUE [15:31:57.997] - relayed: [n=2] TRUE, TRUE [15:31:57.997] - queued futures: [n=2] TRUE, TRUE - flush all [15:31:57.997] - relayed: [n=2] TRUE, TRUE [15:31:57.997] - queued futures: [n=2] TRUE, TRUE [15:31:57.998] signalConditionsASAP(NULL, pos=0) ... done [15:31:57.998] resolve() on list ... DONE [15:31:57.998] result() for ClusterFuture ... [15:31:57.998] - result already collected: FutureResult [15:31:57.999] result() for ClusterFuture ... done [15:31:57.999] result() for ClusterFuture ... [15:31:57.999] - result already collected: FutureResult [15:31:57.999] result() for ClusterFuture ... done [15:31:58.000] result() for ClusterFuture ... [15:31:58.000] - result already collected: FutureResult [15:31:58.000] result() for ClusterFuture ... done [15:31:58.000] result() for ClusterFuture ... [15:31:58.001] - result already collected: FutureResult [15:31:58.001] result() for ClusterFuture ... done [15:31:58.001] - Number of value chunks collected: 2 [15:31:58.002] Resolving 2 futures (chunks) ... DONE [15:31:58.002] Reducing values from 2 chunks ... [15:31:58.002] - Number of values collected after concatenation: 4 [15:31:58.002] - Number of values expected: 4 [15:31:58.003] Reducing values from 2 chunks ... DONE [15:31:58.003] 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, ...) ... [15:31:58.008] future_lapply() ... [15:31:58.025] Number of chunks: 1 [15:31:58.026] getGlobalsAndPackagesXApply() ... [15:31:58.026] - future.globals: TRUE [15:31:58.026] getGlobalsAndPackages() ... [15:31:58.027] Searching for globals... [15:31:58.041] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [15:31:58.041] Searching for globals ... DONE [15:31:58.041] Resolving globals: FALSE [15:31:58.043] The total size of the 1 globals is 69.62 KiB (71288 bytes) [15:31:58.043] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 69.62 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (69.62 KiB of class 'function') [15:31:58.043] - globals: [1] 'FUN' [15:31:58.043] - packages: [1] 'future' [15:31:58.044] getGlobalsAndPackages() ... DONE [15:31:58.044] - globals found/used: [n=1] 'FUN' [15:31:58.044] - needed namespaces: [n=1] 'future' [15:31:58.044] Finding globals ... DONE [15:31:58.044] - use_args: TRUE [15:31:58.045] - Getting '...' globals ... [15:31:58.045] resolve() on list ... [15:31:58.045] recursive: 0 [15:31:58.045] length: 1 [15:31:58.046] elements: '...' [15:31:58.046] length: 0 (resolved future 1) [15:31:58.046] resolve() on list ... DONE [15:31:58.046] - '...' content: [n=2] 'collapse', 'maxHead' [15:31:58.047] List of 1 [15:31:58.047] $ ...:List of 2 [15:31:58.047] ..$ collapse: chr "; " [15:31:58.047] ..$ maxHead : int 3 [15:31:58.047] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:58.047] - attr(*, "where")=List of 1 [15:31:58.047] ..$ ...: [15:31:58.047] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:58.047] - attr(*, "resolved")= logi TRUE [15:31:58.047] - attr(*, "total_size")= num NA [15:31:58.051] - Getting '...' globals ... DONE [15:31:58.052] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:58.052] List of 2 [15:31:58.052] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:58.052] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:58.052] $ ... :List of 2 [15:31:58.052] ..$ collapse: chr "; " [15:31:58.052] ..$ maxHead : int 3 [15:31:58.052] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:58.052] - attr(*, "where")=List of 2 [15:31:58.052] ..$ ...future.FUN: [15:31:58.052] ..$ ... : [15:31:58.052] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:58.052] - attr(*, "resolved")= logi FALSE [15:31:58.052] - attr(*, "total_size")= num 71456 [15:31:58.056] Packages to be attached in all futures: [n=1] 'future' [15:31:58.056] getGlobalsAndPackagesXApply() ... DONE [15:31:58.057] Number of futures (= number of chunks): 1 [15:31:58.057] Launching 1 futures (chunks) ... [15:31:58.057] Chunk #1 of 1 ... [15:31:58.057] - Finding globals in 'X' for chunk #1 ... [15:31:58.057] getGlobalsAndPackages() ... [15:31:58.058] Searching for globals... [15:31:58.058] [15:31:58.058] Searching for globals ... DONE [15:31:58.058] - globals: [0] [15:31:58.058] getGlobalsAndPackages() ... DONE [15:31:58.059] + additional globals found: [n=0] [15:31:58.059] + additional namespaces needed: [n=0] [15:31:58.059] - Finding globals in 'X' for chunk #1 ... DONE [15:31:58.059] - seeds: [15:31:58.059] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.059] getGlobalsAndPackages() ... [15:31:58.060] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.060] Resolving globals: FALSE [15:31:58.060] Tweak future expression to call with '...' arguments ... [15:31:58.060] { [15:31:58.060] do.call(function(...) { [15:31:58.060] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:58.060] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:58.060] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:58.060] on.exit(options(oopts), add = TRUE) [15:31:58.060] } [15:31:58.060] { [15:31:58.060] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:58.060] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:58.060] ...future.FUN(...future.X_jj, ...) [15:31:58.060] }) [15:31:58.060] } [15:31:58.060] }, args = future.call.arguments) [15:31:58.060] } [15:31:58.061] Tweak future expression to call with '...' arguments ... DONE [15:31:58.061] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.062] - packages: [1] 'future' [15:31:58.062] getGlobalsAndPackages() ... DONE [15:31:58.062] run() for 'Future' ... [15:31:58.062] - state: 'created' [15:31:58.063] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:58.080] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:58.080] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:58.080] - Field: 'node' [15:31:58.081] - Field: 'label' [15:31:58.081] - Field: 'local' [15:31:58.081] - Field: 'owner' [15:31:58.081] - Field: 'envir' [15:31:58.082] - Field: 'workers' [15:31:58.082] - Field: 'packages' [15:31:58.082] - Field: 'gc' [15:31:58.083] - Field: 'conditions' [15:31:58.083] - Field: 'persistent' [15:31:58.083] - Field: 'expr' [15:31:58.083] - Field: 'uuid' [15:31:58.083] - Field: 'seed' [15:31:58.084] - Field: 'version' [15:31:58.084] - Field: 'result' [15:31:58.084] - Field: 'asynchronous' [15:31:58.084] - Field: 'calls' [15:31:58.084] - Field: 'globals' [15:31:58.085] - Field: 'stdout' [15:31:58.085] - Field: 'earlySignal' [15:31:58.085] - Field: 'lazy' [15:31:58.085] - Field: 'state' [15:31:58.085] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:58.086] - Launch lazy future ... [15:31:58.086] Packages needed by the future expression (n = 1): 'future' [15:31:58.087] Packages needed by future strategies (n = 0): [15:31:58.088] { [15:31:58.088] { [15:31:58.088] { [15:31:58.088] ...future.startTime <- base::Sys.time() [15:31:58.088] { [15:31:58.088] { [15:31:58.088] { [15:31:58.088] { [15:31:58.088] { [15:31:58.088] base::local({ [15:31:58.088] has_future <- base::requireNamespace("future", [15:31:58.088] quietly = TRUE) [15:31:58.088] if (has_future) { [15:31:58.088] ns <- base::getNamespace("future") [15:31:58.088] version <- ns[[".package"]][["version"]] [15:31:58.088] if (is.null(version)) [15:31:58.088] version <- utils::packageVersion("future") [15:31:58.088] } [15:31:58.088] else { [15:31:58.088] version <- NULL [15:31:58.088] } [15:31:58.088] if (!has_future || version < "1.8.0") { [15:31:58.088] info <- base::c(r_version = base::gsub("R version ", [15:31:58.088] "", base::R.version$version.string), [15:31:58.088] platform = base::sprintf("%s (%s-bit)", [15:31:58.088] base::R.version$platform, 8 * [15:31:58.088] base::.Machine$sizeof.pointer), [15:31:58.088] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:58.088] "release", "version")], collapse = " "), [15:31:58.088] hostname = base::Sys.info()[["nodename"]]) [15:31:58.088] info <- base::sprintf("%s: %s", base::names(info), [15:31:58.088] info) [15:31:58.088] info <- base::paste(info, collapse = "; ") [15:31:58.088] if (!has_future) { [15:31:58.088] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:58.088] info) [15:31:58.088] } [15:31:58.088] else { [15:31:58.088] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:58.088] info, version) [15:31:58.088] } [15:31:58.088] base::stop(msg) [15:31:58.088] } [15:31:58.088] }) [15:31:58.088] } [15:31:58.088] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:58.088] base::options(mc.cores = 1L) [15:31:58.088] } [15:31:58.088] base::local({ [15:31:58.088] for (pkg in "future") { [15:31:58.088] base::loadNamespace(pkg) [15:31:58.088] base::library(pkg, character.only = TRUE) [15:31:58.088] } [15:31:58.088] }) [15:31:58.088] } [15:31:58.088] ...future.strategy.old <- future::plan("list") [15:31:58.088] options(future.plan = NULL) [15:31:58.088] Sys.unsetenv("R_FUTURE_PLAN") [15:31:58.088] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:58.088] } [15:31:58.088] ...future.workdir <- getwd() [15:31:58.088] } [15:31:58.088] ...future.oldOptions <- base::as.list(base::.Options) [15:31:58.088] ...future.oldEnvVars <- base::Sys.getenv() [15:31:58.088] } [15:31:58.088] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:58.088] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:58.088] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:58.088] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:58.088] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:58.088] future.stdout.windows.reencode = NULL, width = 80L) [15:31:58.088] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:58.088] base::names(...future.oldOptions)) [15:31:58.088] } [15:31:58.088] if (FALSE) { [15:31:58.088] } [15:31:58.088] else { [15:31:58.088] if (TRUE) { [15:31:58.088] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:58.088] open = "w") [15:31:58.088] } [15:31:58.088] else { [15:31:58.088] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:58.088] windows = "NUL", "/dev/null"), open = "w") [15:31:58.088] } [15:31:58.088] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:58.088] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:58.088] base::sink(type = "output", split = FALSE) [15:31:58.088] base::close(...future.stdout) [15:31:58.088] }, add = TRUE) [15:31:58.088] } [15:31:58.088] ...future.frame <- base::sys.nframe() [15:31:58.088] ...future.conditions <- base::list() [15:31:58.088] ...future.rng <- base::globalenv()$.Random.seed [15:31:58.088] if (FALSE) { [15:31:58.088] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:58.088] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:58.088] } [15:31:58.088] ...future.result <- base::tryCatch({ [15:31:58.088] base::withCallingHandlers({ [15:31:58.088] ...future.value <- base::withVisible(base::local({ [15:31:58.088] ...future.makeSendCondition <- base::local({ [15:31:58.088] sendCondition <- NULL [15:31:58.088] function(frame = 1L) { [15:31:58.088] if (is.function(sendCondition)) [15:31:58.088] return(sendCondition) [15:31:58.088] ns <- getNamespace("parallel") [15:31:58.088] if (exists("sendData", mode = "function", [15:31:58.088] envir = ns)) { [15:31:58.088] parallel_sendData <- get("sendData", mode = "function", [15:31:58.088] envir = ns) [15:31:58.088] envir <- sys.frame(frame) [15:31:58.088] master <- NULL [15:31:58.088] while (!identical(envir, .GlobalEnv) && [15:31:58.088] !identical(envir, emptyenv())) { [15:31:58.088] if (exists("master", mode = "list", envir = envir, [15:31:58.088] inherits = FALSE)) { [15:31:58.088] master <- get("master", mode = "list", [15:31:58.088] envir = envir, inherits = FALSE) [15:31:58.088] if (inherits(master, c("SOCKnode", [15:31:58.088] "SOCK0node"))) { [15:31:58.088] sendCondition <<- function(cond) { [15:31:58.088] data <- list(type = "VALUE", value = cond, [15:31:58.088] success = TRUE) [15:31:58.088] parallel_sendData(master, data) [15:31:58.088] } [15:31:58.088] return(sendCondition) [15:31:58.088] } [15:31:58.088] } [15:31:58.088] frame <- frame + 1L [15:31:58.088] envir <- sys.frame(frame) [15:31:58.088] } [15:31:58.088] } [15:31:58.088] sendCondition <<- function(cond) NULL [15:31:58.088] } [15:31:58.088] }) [15:31:58.088] withCallingHandlers({ [15:31:58.088] { [15:31:58.088] do.call(function(...) { [15:31:58.088] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:58.088] if (!identical(...future.globals.maxSize.org, [15:31:58.088] ...future.globals.maxSize)) { [15:31:58.088] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:58.088] on.exit(options(oopts), add = TRUE) [15:31:58.088] } [15:31:58.088] { [15:31:58.088] lapply(seq_along(...future.elements_ii), [15:31:58.088] FUN = function(jj) { [15:31:58.088] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:58.088] ...future.FUN(...future.X_jj, ...) [15:31:58.088] }) [15:31:58.088] } [15:31:58.088] }, args = future.call.arguments) [15:31:58.088] } [15:31:58.088] }, immediateCondition = function(cond) { [15:31:58.088] sendCondition <- ...future.makeSendCondition() [15:31:58.088] sendCondition(cond) [15:31:58.088] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.088] { [15:31:58.088] inherits <- base::inherits [15:31:58.088] invokeRestart <- base::invokeRestart [15:31:58.088] is.null <- base::is.null [15:31:58.088] muffled <- FALSE [15:31:58.088] if (inherits(cond, "message")) { [15:31:58.088] muffled <- grepl(pattern, "muffleMessage") [15:31:58.088] if (muffled) [15:31:58.088] invokeRestart("muffleMessage") [15:31:58.088] } [15:31:58.088] else if (inherits(cond, "warning")) { [15:31:58.088] muffled <- grepl(pattern, "muffleWarning") [15:31:58.088] if (muffled) [15:31:58.088] invokeRestart("muffleWarning") [15:31:58.088] } [15:31:58.088] else if (inherits(cond, "condition")) { [15:31:58.088] if (!is.null(pattern)) { [15:31:58.088] computeRestarts <- base::computeRestarts [15:31:58.088] grepl <- base::grepl [15:31:58.088] restarts <- computeRestarts(cond) [15:31:58.088] for (restart in restarts) { [15:31:58.088] name <- restart$name [15:31:58.088] if (is.null(name)) [15:31:58.088] next [15:31:58.088] if (!grepl(pattern, name)) [15:31:58.088] next [15:31:58.088] invokeRestart(restart) [15:31:58.088] muffled <- TRUE [15:31:58.088] break [15:31:58.088] } [15:31:58.088] } [15:31:58.088] } [15:31:58.088] invisible(muffled) [15:31:58.088] } [15:31:58.088] muffleCondition(cond) [15:31:58.088] }) [15:31:58.088] })) [15:31:58.088] future::FutureResult(value = ...future.value$value, [15:31:58.088] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:58.088] ...future.rng), globalenv = if (FALSE) [15:31:58.088] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:58.088] ...future.globalenv.names)) [15:31:58.088] else NULL, started = ...future.startTime, version = "1.8") [15:31:58.088] }, condition = base::local({ [15:31:58.088] c <- base::c [15:31:58.088] inherits <- base::inherits [15:31:58.088] invokeRestart <- base::invokeRestart [15:31:58.088] length <- base::length [15:31:58.088] list <- base::list [15:31:58.088] seq.int <- base::seq.int [15:31:58.088] signalCondition <- base::signalCondition [15:31:58.088] sys.calls <- base::sys.calls [15:31:58.088] `[[` <- base::`[[` [15:31:58.088] `+` <- base::`+` [15:31:58.088] `<<-` <- base::`<<-` [15:31:58.088] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:58.088] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:58.088] 3L)] [15:31:58.088] } [15:31:58.088] function(cond) { [15:31:58.088] is_error <- inherits(cond, "error") [15:31:58.088] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:58.088] NULL) [15:31:58.088] if (is_error) { [15:31:58.088] sessionInformation <- function() { [15:31:58.088] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:58.088] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:58.088] search = base::search(), system = base::Sys.info()) [15:31:58.088] } [15:31:58.088] ...future.conditions[[length(...future.conditions) + [15:31:58.088] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:58.088] cond$call), session = sessionInformation(), [15:31:58.088] timestamp = base::Sys.time(), signaled = 0L) [15:31:58.088] signalCondition(cond) [15:31:58.088] } [15:31:58.088] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:58.088] "immediateCondition"))) { [15:31:58.088] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:58.088] ...future.conditions[[length(...future.conditions) + [15:31:58.088] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:58.088] if (TRUE && !signal) { [15:31:58.088] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.088] { [15:31:58.088] inherits <- base::inherits [15:31:58.088] invokeRestart <- base::invokeRestart [15:31:58.088] is.null <- base::is.null [15:31:58.088] muffled <- FALSE [15:31:58.088] if (inherits(cond, "message")) { [15:31:58.088] muffled <- grepl(pattern, "muffleMessage") [15:31:58.088] if (muffled) [15:31:58.088] invokeRestart("muffleMessage") [15:31:58.088] } [15:31:58.088] else if (inherits(cond, "warning")) { [15:31:58.088] muffled <- grepl(pattern, "muffleWarning") [15:31:58.088] if (muffled) [15:31:58.088] invokeRestart("muffleWarning") [15:31:58.088] } [15:31:58.088] else if (inherits(cond, "condition")) { [15:31:58.088] if (!is.null(pattern)) { [15:31:58.088] computeRestarts <- base::computeRestarts [15:31:58.088] grepl <- base::grepl [15:31:58.088] restarts <- computeRestarts(cond) [15:31:58.088] for (restart in restarts) { [15:31:58.088] name <- restart$name [15:31:58.088] if (is.null(name)) [15:31:58.088] next [15:31:58.088] if (!grepl(pattern, name)) [15:31:58.088] next [15:31:58.088] invokeRestart(restart) [15:31:58.088] muffled <- TRUE [15:31:58.088] break [15:31:58.088] } [15:31:58.088] } [15:31:58.088] } [15:31:58.088] invisible(muffled) [15:31:58.088] } [15:31:58.088] muffleCondition(cond, pattern = "^muffle") [15:31:58.088] } [15:31:58.088] } [15:31:58.088] else { [15:31:58.088] if (TRUE) { [15:31:58.088] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.088] { [15:31:58.088] inherits <- base::inherits [15:31:58.088] invokeRestart <- base::invokeRestart [15:31:58.088] is.null <- base::is.null [15:31:58.088] muffled <- FALSE [15:31:58.088] if (inherits(cond, "message")) { [15:31:58.088] muffled <- grepl(pattern, "muffleMessage") [15:31:58.088] if (muffled) [15:31:58.088] invokeRestart("muffleMessage") [15:31:58.088] } [15:31:58.088] else if (inherits(cond, "warning")) { [15:31:58.088] muffled <- grepl(pattern, "muffleWarning") [15:31:58.088] if (muffled) [15:31:58.088] invokeRestart("muffleWarning") [15:31:58.088] } [15:31:58.088] else if (inherits(cond, "condition")) { [15:31:58.088] if (!is.null(pattern)) { [15:31:58.088] computeRestarts <- base::computeRestarts [15:31:58.088] grepl <- base::grepl [15:31:58.088] restarts <- computeRestarts(cond) [15:31:58.088] for (restart in restarts) { [15:31:58.088] name <- restart$name [15:31:58.088] if (is.null(name)) [15:31:58.088] next [15:31:58.088] if (!grepl(pattern, name)) [15:31:58.088] next [15:31:58.088] invokeRestart(restart) [15:31:58.088] muffled <- TRUE [15:31:58.088] break [15:31:58.088] } [15:31:58.088] } [15:31:58.088] } [15:31:58.088] invisible(muffled) [15:31:58.088] } [15:31:58.088] muffleCondition(cond, pattern = "^muffle") [15:31:58.088] } [15:31:58.088] } [15:31:58.088] } [15:31:58.088] })) [15:31:58.088] }, error = function(ex) { [15:31:58.088] base::structure(base::list(value = NULL, visible = NULL, [15:31:58.088] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:58.088] ...future.rng), started = ...future.startTime, [15:31:58.088] finished = Sys.time(), session_uuid = NA_character_, [15:31:58.088] version = "1.8"), class = "FutureResult") [15:31:58.088] }, finally = { [15:31:58.088] if (!identical(...future.workdir, getwd())) [15:31:58.088] setwd(...future.workdir) [15:31:58.088] { [15:31:58.088] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:58.088] ...future.oldOptions$nwarnings <- NULL [15:31:58.088] } [15:31:58.088] base::options(...future.oldOptions) [15:31:58.088] if (.Platform$OS.type == "windows") { [15:31:58.088] old_names <- names(...future.oldEnvVars) [15:31:58.088] envs <- base::Sys.getenv() [15:31:58.088] names <- names(envs) [15:31:58.088] common <- intersect(names, old_names) [15:31:58.088] added <- setdiff(names, old_names) [15:31:58.088] removed <- setdiff(old_names, names) [15:31:58.088] changed <- common[...future.oldEnvVars[common] != [15:31:58.088] envs[common]] [15:31:58.088] NAMES <- toupper(changed) [15:31:58.088] args <- list() [15:31:58.088] for (kk in seq_along(NAMES)) { [15:31:58.088] name <- changed[[kk]] [15:31:58.088] NAME <- NAMES[[kk]] [15:31:58.088] if (name != NAME && is.element(NAME, old_names)) [15:31:58.088] next [15:31:58.088] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:58.088] } [15:31:58.088] NAMES <- toupper(added) [15:31:58.088] for (kk in seq_along(NAMES)) { [15:31:58.088] name <- added[[kk]] [15:31:58.088] NAME <- NAMES[[kk]] [15:31:58.088] if (name != NAME && is.element(NAME, old_names)) [15:31:58.088] next [15:31:58.088] args[[name]] <- "" [15:31:58.088] } [15:31:58.088] NAMES <- toupper(removed) [15:31:58.088] for (kk in seq_along(NAMES)) { [15:31:58.088] name <- removed[[kk]] [15:31:58.088] NAME <- NAMES[[kk]] [15:31:58.088] if (name != NAME && is.element(NAME, old_names)) [15:31:58.088] next [15:31:58.088] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:58.088] } [15:31:58.088] if (length(args) > 0) [15:31:58.088] base::do.call(base::Sys.setenv, args = args) [15:31:58.088] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:58.088] } [15:31:58.088] else { [15:31:58.088] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:58.088] } [15:31:58.088] { [15:31:58.088] if (base::length(...future.futureOptionsAdded) > [15:31:58.088] 0L) { [15:31:58.088] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:58.088] base::names(opts) <- ...future.futureOptionsAdded [15:31:58.088] base::options(opts) [15:31:58.088] } [15:31:58.088] { [15:31:58.088] { [15:31:58.088] base::options(mc.cores = ...future.mc.cores.old) [15:31:58.088] NULL [15:31:58.088] } [15:31:58.088] options(future.plan = NULL) [15:31:58.088] if (is.na(NA_character_)) [15:31:58.088] Sys.unsetenv("R_FUTURE_PLAN") [15:31:58.088] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:58.088] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:58.088] .init = FALSE) [15:31:58.088] } [15:31:58.088] } [15:31:58.088] } [15:31:58.088] }) [15:31:58.088] if (TRUE) { [15:31:58.088] base::sink(type = "output", split = FALSE) [15:31:58.088] if (TRUE) { [15:31:58.088] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:58.088] } [15:31:58.088] else { [15:31:58.088] ...future.result["stdout"] <- base::list(NULL) [15:31:58.088] } [15:31:58.088] base::close(...future.stdout) [15:31:58.088] ...future.stdout <- NULL [15:31:58.088] } [15:31:58.088] ...future.result$conditions <- ...future.conditions [15:31:58.088] ...future.result$finished <- base::Sys.time() [15:31:58.088] ...future.result [15:31:58.088] } [15:31:58.098] Exporting 5 global objects (69.78 KiB) to cluster node #1 ... [15:31:58.099] Exporting '...future.FUN' (69.62 KiB) to cluster node #1 ... [15:31:58.100] Exporting '...future.FUN' (69.62 KiB) to cluster node #1 ... DONE [15:31:58.101] Exporting 'future.call.arguments' (168 bytes) to cluster node #1 ... [15:31:58.101] Exporting 'future.call.arguments' (168 bytes) to cluster node #1 ... DONE [15:31:58.102] Exporting '...future.elements_ii' (12.83 KiB) to cluster node #1 ... [15:31:58.103] Exporting '...future.elements_ii' (12.83 KiB) to cluster node #1 ... DONE [15:31:58.103] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:58.104] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:58.105] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:58.106] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:58.107] Exporting 5 global objects (69.78 KiB) to cluster node #1 ... DONE [15:31:58.109] MultisessionFuture started [15:31:58.109] - Launch lazy future ... done [15:31:58.109] run() for 'MultisessionFuture' ... done [15:31:58.110] Created future: [15:31:58.139] receiveMessageFromWorker() for ClusterFuture ... [15:31:58.140] - Validating connection of MultisessionFuture [15:31:58.140] - received message: FutureResult [15:31:58.140] - Received FutureResult [15:31:58.141] - Erased future from FutureRegistry [15:31:58.141] result() for ClusterFuture ... [15:31:58.141] - result already collected: FutureResult [15:31:58.141] result() for ClusterFuture ... done [15:31:58.141] receiveMessageFromWorker() for ClusterFuture ... done [15:31:58.110] MultisessionFuture: [15:31:58.110] Label: 'future_lapply-1' [15:31:58.110] Expression: [15:31:58.110] { [15:31:58.110] do.call(function(...) { [15:31:58.110] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:58.110] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:58.110] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:58.110] on.exit(options(oopts), add = TRUE) [15:31:58.110] } [15:31:58.110] { [15:31:58.110] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:58.110] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:58.110] ...future.FUN(...future.X_jj, ...) [15:31:58.110] }) [15:31:58.110] } [15:31:58.110] }, args = future.call.arguments) [15:31:58.110] } [15:31:58.110] Lazy evaluation: FALSE [15:31:58.110] Asynchronous evaluation: TRUE [15:31:58.110] Local evaluation: TRUE [15:31:58.110] Environment: R_GlobalEnv [15:31:58.110] Capture standard output: TRUE [15:31:58.110] Capture condition classes: 'condition' (excluding 'nothing') [15:31:58.110] Globals: 5 objects totaling 82.61 KiB (function '...future.FUN' of 69.62 KiB, DotDotDotList 'future.call.arguments' of 168 bytes, list '...future.elements_ii' of 12.83 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:58.110] Packages: 1 packages ('future') [15:31:58.110] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:58.110] Resolved: TRUE [15:31:58.110] Value: [15:31:58.110] Conditions captured: [15:31:58.110] Early signaling: FALSE [15:31:58.110] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:58.110] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:58.142] Chunk #1 of 1 ... DONE [15:31:58.142] Launching 1 futures (chunks) ... DONE [15:31:58.142] Resolving 1 futures (chunks) ... [15:31:58.143] resolve() on list ... [15:31:58.143] recursive: 0 [15:31:58.143] length: 1 [15:31:58.143] [15:31:58.143] Future #1 [15:31:58.143] result() for ClusterFuture ... [15:31:58.144] - result already collected: FutureResult [15:31:58.144] result() for ClusterFuture ... done [15:31:58.144] result() for ClusterFuture ... [15:31:58.144] - result already collected: FutureResult [15:31:58.144] result() for ClusterFuture ... done [15:31:58.145] signalConditionsASAP(MultisessionFuture, pos=1) ... [15:31:58.145] - nx: 1 [15:31:58.145] - relay: TRUE [15:31:58.145] - stdout: TRUE [15:31:58.145] - signal: TRUE [15:31:58.145] - resignal: FALSE [15:31:58.145] - force: TRUE [15:31:58.146] - relayed: [n=1] FALSE [15:31:58.146] - queued futures: [n=1] FALSE [15:31:58.146] - until=1 [15:31:58.146] - relaying element #1 [15:31:58.146] result() for ClusterFuture ... [15:31:58.146] - result already collected: FutureResult [15:31:58.147] result() for ClusterFuture ... done [15:31:58.147] result() for ClusterFuture ... [15:31:58.147] - result already collected: FutureResult [15:31:58.147] result() for ClusterFuture ... done [15:31:58.147] result() for ClusterFuture ... [15:31:58.148] - result already collected: FutureResult [15:31:58.148] result() for ClusterFuture ... done [15:31:58.148] result() for ClusterFuture ... [15:31:58.148] - result already collected: FutureResult [15:31:58.148] result() for ClusterFuture ... done [15:31:58.148] - relayed: [n=1] TRUE [15:31:58.149] - queued futures: [n=1] TRUE [15:31:58.149] signalConditionsASAP(MultisessionFuture, pos=1) ... done [15:31:58.149] length: 0 (resolved future 1) [15:31:58.149] Relaying remaining futures [15:31:58.149] signalConditionsASAP(NULL, pos=0) ... [15:31:58.149] - nx: 1 [15:31:58.150] - relay: TRUE [15:31:58.150] - stdout: TRUE [15:31:58.150] - signal: TRUE [15:31:58.150] - resignal: FALSE [15:31:58.150] - force: TRUE [15:31:58.150] - relayed: [n=1] TRUE [15:31:58.150] - queued futures: [n=1] TRUE - flush all [15:31:58.151] - relayed: [n=1] TRUE [15:31:58.151] - queued futures: [n=1] TRUE [15:31:58.151] signalConditionsASAP(NULL, pos=0) ... done [15:31:58.151] resolve() on list ... DONE [15:31:58.152] result() for ClusterFuture ... [15:31:58.152] - result already collected: FutureResult [15:31:58.152] result() for ClusterFuture ... done [15:31:58.152] result() for ClusterFuture ... [15:31:58.152] - result already collected: FutureResult [15:31:58.152] result() for ClusterFuture ... done [15:31:58.153] - Number of value chunks collected: 1 [15:31:58.153] Resolving 1 futures (chunks) ... DONE [15:31:58.153] Reducing values from 1 chunks ... [15:31:58.153] - Number of values collected after concatenation: 1 [15:31:58.153] - Number of values expected: 1 [15:31:58.153] Reducing values from 1 chunks ... DONE [15:31:58.154] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [15:31:58.155] future_lapply() ... [15:31:58.160] Number of chunks: 2 [15:31:58.161] getGlobalsAndPackagesXApply() ... [15:31:58.161] - future.globals: TRUE [15:31:58.161] getGlobalsAndPackages() ... [15:31:58.161] Searching for globals... [15:31:58.164] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [15:31:58.164] Searching for globals ... DONE [15:31:58.164] Resolving globals: FALSE [15:31:58.165] The total size of the 1 globals is 4.85 KiB (4968 bytes) [15:31:58.166] The total size of the 1 globals exported for future expression ('FUN()') is 4.85 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (4.85 KiB of class 'function') [15:31:58.166] - globals: [1] 'FUN' [15:31:58.167] - packages: [1] 'listenv' [15:31:58.167] getGlobalsAndPackages() ... DONE [15:31:58.167] - globals found/used: [n=1] 'FUN' [15:31:58.167] - needed namespaces: [n=1] 'listenv' [15:31:58.168] Finding globals ... DONE [15:31:58.168] - use_args: TRUE [15:31:58.168] - Getting '...' globals ... [15:31:58.169] resolve() on list ... [15:31:58.169] recursive: 0 [15:31:58.169] length: 1 [15:31:58.170] elements: '...' [15:31:58.170] length: 0 (resolved future 1) [15:31:58.170] resolve() on list ... DONE [15:31:58.171] - '...' content: [n=0] [15:31:58.171] List of 1 [15:31:58.171] $ ...: list() [15:31:58.171] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:58.171] - attr(*, "where")=List of 1 [15:31:58.171] ..$ ...: [15:31:58.171] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:58.171] - attr(*, "resolved")= logi TRUE [15:31:58.171] - attr(*, "total_size")= num NA [15:31:58.176] - Getting '...' globals ... DONE [15:31:58.176] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:58.177] List of 2 [15:31:58.177] $ ...future.FUN:function (x, ...) [15:31:58.177] $ ... : list() [15:31:58.177] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:58.177] - attr(*, "where")=List of 2 [15:31:58.177] ..$ ...future.FUN: [15:31:58.177] ..$ ... : [15:31:58.177] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:58.177] - attr(*, "resolved")= logi FALSE [15:31:58.177] - attr(*, "total_size")= num 4968 [15:31:58.182] Packages to be attached in all futures: [n=1] 'listenv' [15:31:58.182] getGlobalsAndPackagesXApply() ... DONE [15:31:58.183] Number of futures (= number of chunks): 2 [15:31:58.183] Launching 2 futures (chunks) ... [15:31:58.183] Chunk #1 of 2 ... [15:31:58.184] - Finding globals in 'X' for chunk #1 ... [15:31:58.184] getGlobalsAndPackages() ... [15:31:58.184] Searching for globals... [15:31:58.185] [15:31:58.185] Searching for globals ... DONE [15:31:58.186] - globals: [0] [15:31:58.186] getGlobalsAndPackages() ... DONE [15:31:58.186] + additional globals found: [n=0] [15:31:58.186] + additional namespaces needed: [n=0] [15:31:58.187] - Finding globals in 'X' for chunk #1 ... DONE [15:31:58.187] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:58.187] - seeds: [15:31:58.187] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.188] getGlobalsAndPackages() ... [15:31:58.188] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.188] Resolving globals: FALSE [15:31:58.189] Tweak future expression to call with '...' arguments ... [15:31:58.189] { [15:31:58.189] do.call(function(...) { [15:31:58.189] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:58.189] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:58.189] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:58.189] on.exit(options(oopts), add = TRUE) [15:31:58.189] } [15:31:58.189] { [15:31:58.189] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:58.189] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:58.189] ...future.FUN(...future.X_jj, ...) [15:31:58.189] }) [15:31:58.189] } [15:31:58.189] }, args = future.call.arguments) [15:31:58.189] } [15:31:58.190] Tweak future expression to call with '...' arguments ... DONE [15:31:58.190] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.191] - packages: [1] 'listenv' [15:31:58.191] getGlobalsAndPackages() ... DONE [15:31:58.192] run() for 'Future' ... [15:31:58.192] - state: 'created' [15:31:58.193] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:58.212] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:58.212] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:58.213] - Field: 'node' [15:31:58.213] - Field: 'label' [15:31:58.213] - Field: 'local' [15:31:58.214] - Field: 'owner' [15:31:58.214] - Field: 'envir' [15:31:58.214] - Field: 'workers' [15:31:58.215] - Field: 'packages' [15:31:58.215] - Field: 'gc' [15:31:58.216] - Field: 'conditions' [15:31:58.216] - Field: 'persistent' [15:31:58.216] - Field: 'expr' [15:31:58.217] - Field: 'uuid' [15:31:58.217] - Field: 'seed' [15:31:58.217] - Field: 'version' [15:31:58.218] - Field: 'result' [15:31:58.218] - Field: 'asynchronous' [15:31:58.218] - Field: 'calls' [15:31:58.219] - Field: 'globals' [15:31:58.219] - Field: 'stdout' [15:31:58.219] - Field: 'earlySignal' [15:31:58.220] - Field: 'lazy' [15:31:58.220] - Field: 'state' [15:31:58.220] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:58.221] - Launch lazy future ... [15:31:58.221] Packages needed by the future expression (n = 1): 'listenv' [15:31:58.222] Packages needed by future strategies (n = 0): [15:31:58.224] { [15:31:58.224] { [15:31:58.224] { [15:31:58.224] ...future.startTime <- base::Sys.time() [15:31:58.224] { [15:31:58.224] { [15:31:58.224] { [15:31:58.224] { [15:31:58.224] { [15:31:58.224] base::local({ [15:31:58.224] has_future <- base::requireNamespace("future", [15:31:58.224] quietly = TRUE) [15:31:58.224] if (has_future) { [15:31:58.224] ns <- base::getNamespace("future") [15:31:58.224] version <- ns[[".package"]][["version"]] [15:31:58.224] if (is.null(version)) [15:31:58.224] version <- utils::packageVersion("future") [15:31:58.224] } [15:31:58.224] else { [15:31:58.224] version <- NULL [15:31:58.224] } [15:31:58.224] if (!has_future || version < "1.8.0") { [15:31:58.224] info <- base::c(r_version = base::gsub("R version ", [15:31:58.224] "", base::R.version$version.string), [15:31:58.224] platform = base::sprintf("%s (%s-bit)", [15:31:58.224] base::R.version$platform, 8 * [15:31:58.224] base::.Machine$sizeof.pointer), [15:31:58.224] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:58.224] "release", "version")], collapse = " "), [15:31:58.224] hostname = base::Sys.info()[["nodename"]]) [15:31:58.224] info <- base::sprintf("%s: %s", base::names(info), [15:31:58.224] info) [15:31:58.224] info <- base::paste(info, collapse = "; ") [15:31:58.224] if (!has_future) { [15:31:58.224] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:58.224] info) [15:31:58.224] } [15:31:58.224] else { [15:31:58.224] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:58.224] info, version) [15:31:58.224] } [15:31:58.224] base::stop(msg) [15:31:58.224] } [15:31:58.224] }) [15:31:58.224] } [15:31:58.224] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:58.224] base::options(mc.cores = 1L) [15:31:58.224] } [15:31:58.224] base::local({ [15:31:58.224] for (pkg in "listenv") { [15:31:58.224] base::loadNamespace(pkg) [15:31:58.224] base::library(pkg, character.only = TRUE) [15:31:58.224] } [15:31:58.224] }) [15:31:58.224] } [15:31:58.224] ...future.strategy.old <- future::plan("list") [15:31:58.224] options(future.plan = NULL) [15:31:58.224] Sys.unsetenv("R_FUTURE_PLAN") [15:31:58.224] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:58.224] } [15:31:58.224] ...future.workdir <- getwd() [15:31:58.224] } [15:31:58.224] ...future.oldOptions <- base::as.list(base::.Options) [15:31:58.224] ...future.oldEnvVars <- base::Sys.getenv() [15:31:58.224] } [15:31:58.224] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:58.224] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:58.224] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:58.224] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:58.224] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:58.224] future.stdout.windows.reencode = NULL, width = 80L) [15:31:58.224] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:58.224] base::names(...future.oldOptions)) [15:31:58.224] } [15:31:58.224] if (FALSE) { [15:31:58.224] } [15:31:58.224] else { [15:31:58.224] if (TRUE) { [15:31:58.224] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:58.224] open = "w") [15:31:58.224] } [15:31:58.224] else { [15:31:58.224] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:58.224] windows = "NUL", "/dev/null"), open = "w") [15:31:58.224] } [15:31:58.224] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:58.224] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:58.224] base::sink(type = "output", split = FALSE) [15:31:58.224] base::close(...future.stdout) [15:31:58.224] }, add = TRUE) [15:31:58.224] } [15:31:58.224] ...future.frame <- base::sys.nframe() [15:31:58.224] ...future.conditions <- base::list() [15:31:58.224] ...future.rng <- base::globalenv()$.Random.seed [15:31:58.224] if (FALSE) { [15:31:58.224] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:58.224] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:58.224] } [15:31:58.224] ...future.result <- base::tryCatch({ [15:31:58.224] base::withCallingHandlers({ [15:31:58.224] ...future.value <- base::withVisible(base::local({ [15:31:58.224] ...future.makeSendCondition <- base::local({ [15:31:58.224] sendCondition <- NULL [15:31:58.224] function(frame = 1L) { [15:31:58.224] if (is.function(sendCondition)) [15:31:58.224] return(sendCondition) [15:31:58.224] ns <- getNamespace("parallel") [15:31:58.224] if (exists("sendData", mode = "function", [15:31:58.224] envir = ns)) { [15:31:58.224] parallel_sendData <- get("sendData", mode = "function", [15:31:58.224] envir = ns) [15:31:58.224] envir <- sys.frame(frame) [15:31:58.224] master <- NULL [15:31:58.224] while (!identical(envir, .GlobalEnv) && [15:31:58.224] !identical(envir, emptyenv())) { [15:31:58.224] if (exists("master", mode = "list", envir = envir, [15:31:58.224] inherits = FALSE)) { [15:31:58.224] master <- get("master", mode = "list", [15:31:58.224] envir = envir, inherits = FALSE) [15:31:58.224] if (inherits(master, c("SOCKnode", [15:31:58.224] "SOCK0node"))) { [15:31:58.224] sendCondition <<- function(cond) { [15:31:58.224] data <- list(type = "VALUE", value = cond, [15:31:58.224] success = TRUE) [15:31:58.224] parallel_sendData(master, data) [15:31:58.224] } [15:31:58.224] return(sendCondition) [15:31:58.224] } [15:31:58.224] } [15:31:58.224] frame <- frame + 1L [15:31:58.224] envir <- sys.frame(frame) [15:31:58.224] } [15:31:58.224] } [15:31:58.224] sendCondition <<- function(cond) NULL [15:31:58.224] } [15:31:58.224] }) [15:31:58.224] withCallingHandlers({ [15:31:58.224] { [15:31:58.224] do.call(function(...) { [15:31:58.224] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:58.224] if (!identical(...future.globals.maxSize.org, [15:31:58.224] ...future.globals.maxSize)) { [15:31:58.224] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:58.224] on.exit(options(oopts), add = TRUE) [15:31:58.224] } [15:31:58.224] { [15:31:58.224] lapply(seq_along(...future.elements_ii), [15:31:58.224] FUN = function(jj) { [15:31:58.224] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:58.224] ...future.FUN(...future.X_jj, ...) [15:31:58.224] }) [15:31:58.224] } [15:31:58.224] }, args = future.call.arguments) [15:31:58.224] } [15:31:58.224] }, immediateCondition = function(cond) { [15:31:58.224] sendCondition <- ...future.makeSendCondition() [15:31:58.224] sendCondition(cond) [15:31:58.224] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.224] { [15:31:58.224] inherits <- base::inherits [15:31:58.224] invokeRestart <- base::invokeRestart [15:31:58.224] is.null <- base::is.null [15:31:58.224] muffled <- FALSE [15:31:58.224] if (inherits(cond, "message")) { [15:31:58.224] muffled <- grepl(pattern, "muffleMessage") [15:31:58.224] if (muffled) [15:31:58.224] invokeRestart("muffleMessage") [15:31:58.224] } [15:31:58.224] else if (inherits(cond, "warning")) { [15:31:58.224] muffled <- grepl(pattern, "muffleWarning") [15:31:58.224] if (muffled) [15:31:58.224] invokeRestart("muffleWarning") [15:31:58.224] } [15:31:58.224] else if (inherits(cond, "condition")) { [15:31:58.224] if (!is.null(pattern)) { [15:31:58.224] computeRestarts <- base::computeRestarts [15:31:58.224] grepl <- base::grepl [15:31:58.224] restarts <- computeRestarts(cond) [15:31:58.224] for (restart in restarts) { [15:31:58.224] name <- restart$name [15:31:58.224] if (is.null(name)) [15:31:58.224] next [15:31:58.224] if (!grepl(pattern, name)) [15:31:58.224] next [15:31:58.224] invokeRestart(restart) [15:31:58.224] muffled <- TRUE [15:31:58.224] break [15:31:58.224] } [15:31:58.224] } [15:31:58.224] } [15:31:58.224] invisible(muffled) [15:31:58.224] } [15:31:58.224] muffleCondition(cond) [15:31:58.224] }) [15:31:58.224] })) [15:31:58.224] future::FutureResult(value = ...future.value$value, [15:31:58.224] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:58.224] ...future.rng), globalenv = if (FALSE) [15:31:58.224] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:58.224] ...future.globalenv.names)) [15:31:58.224] else NULL, started = ...future.startTime, version = "1.8") [15:31:58.224] }, condition = base::local({ [15:31:58.224] c <- base::c [15:31:58.224] inherits <- base::inherits [15:31:58.224] invokeRestart <- base::invokeRestart [15:31:58.224] length <- base::length [15:31:58.224] list <- base::list [15:31:58.224] seq.int <- base::seq.int [15:31:58.224] signalCondition <- base::signalCondition [15:31:58.224] sys.calls <- base::sys.calls [15:31:58.224] `[[` <- base::`[[` [15:31:58.224] `+` <- base::`+` [15:31:58.224] `<<-` <- base::`<<-` [15:31:58.224] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:58.224] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:58.224] 3L)] [15:31:58.224] } [15:31:58.224] function(cond) { [15:31:58.224] is_error <- inherits(cond, "error") [15:31:58.224] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:58.224] NULL) [15:31:58.224] if (is_error) { [15:31:58.224] sessionInformation <- function() { [15:31:58.224] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:58.224] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:58.224] search = base::search(), system = base::Sys.info()) [15:31:58.224] } [15:31:58.224] ...future.conditions[[length(...future.conditions) + [15:31:58.224] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:58.224] cond$call), session = sessionInformation(), [15:31:58.224] timestamp = base::Sys.time(), signaled = 0L) [15:31:58.224] signalCondition(cond) [15:31:58.224] } [15:31:58.224] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:58.224] "immediateCondition"))) { [15:31:58.224] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:58.224] ...future.conditions[[length(...future.conditions) + [15:31:58.224] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:58.224] if (TRUE && !signal) { [15:31:58.224] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.224] { [15:31:58.224] inherits <- base::inherits [15:31:58.224] invokeRestart <- base::invokeRestart [15:31:58.224] is.null <- base::is.null [15:31:58.224] muffled <- FALSE [15:31:58.224] if (inherits(cond, "message")) { [15:31:58.224] muffled <- grepl(pattern, "muffleMessage") [15:31:58.224] if (muffled) [15:31:58.224] invokeRestart("muffleMessage") [15:31:58.224] } [15:31:58.224] else if (inherits(cond, "warning")) { [15:31:58.224] muffled <- grepl(pattern, "muffleWarning") [15:31:58.224] if (muffled) [15:31:58.224] invokeRestart("muffleWarning") [15:31:58.224] } [15:31:58.224] else if (inherits(cond, "condition")) { [15:31:58.224] if (!is.null(pattern)) { [15:31:58.224] computeRestarts <- base::computeRestarts [15:31:58.224] grepl <- base::grepl [15:31:58.224] restarts <- computeRestarts(cond) [15:31:58.224] for (restart in restarts) { [15:31:58.224] name <- restart$name [15:31:58.224] if (is.null(name)) [15:31:58.224] next [15:31:58.224] if (!grepl(pattern, name)) [15:31:58.224] next [15:31:58.224] invokeRestart(restart) [15:31:58.224] muffled <- TRUE [15:31:58.224] break [15:31:58.224] } [15:31:58.224] } [15:31:58.224] } [15:31:58.224] invisible(muffled) [15:31:58.224] } [15:31:58.224] muffleCondition(cond, pattern = "^muffle") [15:31:58.224] } [15:31:58.224] } [15:31:58.224] else { [15:31:58.224] if (TRUE) { [15:31:58.224] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.224] { [15:31:58.224] inherits <- base::inherits [15:31:58.224] invokeRestart <- base::invokeRestart [15:31:58.224] is.null <- base::is.null [15:31:58.224] muffled <- FALSE [15:31:58.224] if (inherits(cond, "message")) { [15:31:58.224] muffled <- grepl(pattern, "muffleMessage") [15:31:58.224] if (muffled) [15:31:58.224] invokeRestart("muffleMessage") [15:31:58.224] } [15:31:58.224] else if (inherits(cond, "warning")) { [15:31:58.224] muffled <- grepl(pattern, "muffleWarning") [15:31:58.224] if (muffled) [15:31:58.224] invokeRestart("muffleWarning") [15:31:58.224] } [15:31:58.224] else if (inherits(cond, "condition")) { [15:31:58.224] if (!is.null(pattern)) { [15:31:58.224] computeRestarts <- base::computeRestarts [15:31:58.224] grepl <- base::grepl [15:31:58.224] restarts <- computeRestarts(cond) [15:31:58.224] for (restart in restarts) { [15:31:58.224] name <- restart$name [15:31:58.224] if (is.null(name)) [15:31:58.224] next [15:31:58.224] if (!grepl(pattern, name)) [15:31:58.224] next [15:31:58.224] invokeRestart(restart) [15:31:58.224] muffled <- TRUE [15:31:58.224] break [15:31:58.224] } [15:31:58.224] } [15:31:58.224] } [15:31:58.224] invisible(muffled) [15:31:58.224] } [15:31:58.224] muffleCondition(cond, pattern = "^muffle") [15:31:58.224] } [15:31:58.224] } [15:31:58.224] } [15:31:58.224] })) [15:31:58.224] }, error = function(ex) { [15:31:58.224] base::structure(base::list(value = NULL, visible = NULL, [15:31:58.224] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:58.224] ...future.rng), started = ...future.startTime, [15:31:58.224] finished = Sys.time(), session_uuid = NA_character_, [15:31:58.224] version = "1.8"), class = "FutureResult") [15:31:58.224] }, finally = { [15:31:58.224] if (!identical(...future.workdir, getwd())) [15:31:58.224] setwd(...future.workdir) [15:31:58.224] { [15:31:58.224] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:58.224] ...future.oldOptions$nwarnings <- NULL [15:31:58.224] } [15:31:58.224] base::options(...future.oldOptions) [15:31:58.224] if (.Platform$OS.type == "windows") { [15:31:58.224] old_names <- names(...future.oldEnvVars) [15:31:58.224] envs <- base::Sys.getenv() [15:31:58.224] names <- names(envs) [15:31:58.224] common <- intersect(names, old_names) [15:31:58.224] added <- setdiff(names, old_names) [15:31:58.224] removed <- setdiff(old_names, names) [15:31:58.224] changed <- common[...future.oldEnvVars[common] != [15:31:58.224] envs[common]] [15:31:58.224] NAMES <- toupper(changed) [15:31:58.224] args <- list() [15:31:58.224] for (kk in seq_along(NAMES)) { [15:31:58.224] name <- changed[[kk]] [15:31:58.224] NAME <- NAMES[[kk]] [15:31:58.224] if (name != NAME && is.element(NAME, old_names)) [15:31:58.224] next [15:31:58.224] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:58.224] } [15:31:58.224] NAMES <- toupper(added) [15:31:58.224] for (kk in seq_along(NAMES)) { [15:31:58.224] name <- added[[kk]] [15:31:58.224] NAME <- NAMES[[kk]] [15:31:58.224] if (name != NAME && is.element(NAME, old_names)) [15:31:58.224] next [15:31:58.224] args[[name]] <- "" [15:31:58.224] } [15:31:58.224] NAMES <- toupper(removed) [15:31:58.224] for (kk in seq_along(NAMES)) { [15:31:58.224] name <- removed[[kk]] [15:31:58.224] NAME <- NAMES[[kk]] [15:31:58.224] if (name != NAME && is.element(NAME, old_names)) [15:31:58.224] next [15:31:58.224] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:58.224] } [15:31:58.224] if (length(args) > 0) [15:31:58.224] base::do.call(base::Sys.setenv, args = args) [15:31:58.224] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:58.224] } [15:31:58.224] else { [15:31:58.224] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:58.224] } [15:31:58.224] { [15:31:58.224] if (base::length(...future.futureOptionsAdded) > [15:31:58.224] 0L) { [15:31:58.224] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:58.224] base::names(opts) <- ...future.futureOptionsAdded [15:31:58.224] base::options(opts) [15:31:58.224] } [15:31:58.224] { [15:31:58.224] { [15:31:58.224] base::options(mc.cores = ...future.mc.cores.old) [15:31:58.224] NULL [15:31:58.224] } [15:31:58.224] options(future.plan = NULL) [15:31:58.224] if (is.na(NA_character_)) [15:31:58.224] Sys.unsetenv("R_FUTURE_PLAN") [15:31:58.224] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:58.224] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:58.224] .init = FALSE) [15:31:58.224] } [15:31:58.224] } [15:31:58.224] } [15:31:58.224] }) [15:31:58.224] if (TRUE) { [15:31:58.224] base::sink(type = "output", split = FALSE) [15:31:58.224] if (TRUE) { [15:31:58.224] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:58.224] } [15:31:58.224] else { [15:31:58.224] ...future.result["stdout"] <- base::list(NULL) [15:31:58.224] } [15:31:58.224] base::close(...future.stdout) [15:31:58.224] ...future.stdout <- NULL [15:31:58.224] } [15:31:58.224] ...future.result$conditions <- ...future.conditions [15:31:58.224] ...future.result$finished <- base::Sys.time() [15:31:58.224] ...future.result [15:31:58.224] } [15:31:58.236] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... [15:31:58.237] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... [15:31:58.238] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... DONE [15:31:58.238] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [15:31:58.239] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [15:31:58.239] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [15:31:58.240] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [15:31:58.240] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:58.241] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:58.241] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:58.242] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:58.242] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... DONE [15:31:58.243] MultisessionFuture started [15:31:58.244] - Launch lazy future ... done [15:31:58.244] run() for 'MultisessionFuture' ... done [15:31:58.244] Created future: [15:31:58.278] receiveMessageFromWorker() for ClusterFuture ... [15:31:58.279] - Validating connection of MultisessionFuture [15:31:58.279] - received message: FutureResult [15:31:58.280] - Received FutureResult [15:31:58.280] - Erased future from FutureRegistry [15:31:58.280] result() for ClusterFuture ... [15:31:58.281] - result already collected: FutureResult [15:31:58.281] result() for ClusterFuture ... done [15:31:58.281] receiveMessageFromWorker() for ClusterFuture ... done [15:31:58.245] MultisessionFuture: [15:31:58.245] Label: 'future_lapply-1' [15:31:58.245] Expression: [15:31:58.245] { [15:31:58.245] do.call(function(...) { [15:31:58.245] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:58.245] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:58.245] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:58.245] on.exit(options(oopts), add = TRUE) [15:31:58.245] } [15:31:58.245] { [15:31:58.245] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:58.245] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:58.245] ...future.FUN(...future.X_jj, ...) [15:31:58.245] }) [15:31:58.245] } [15:31:58.245] }, args = future.call.arguments) [15:31:58.245] } [15:31:58.245] Lazy evaluation: FALSE [15:31:58.245] Asynchronous evaluation: TRUE [15:31:58.245] Local evaluation: TRUE [15:31:58.245] Environment: R_GlobalEnv [15:31:58.245] Capture standard output: TRUE [15:31:58.245] Capture condition classes: 'condition' (excluding 'nothing') [15:31:58.245] Globals: 5 objects totaling 4.96 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:58.245] Packages: 1 packages ('listenv') [15:31:58.245] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:58.245] Resolved: TRUE [15:31:58.245] Value: [15:31:58.245] Conditions captured: [15:31:58.245] Early signaling: FALSE [15:31:58.245] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:58.245] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:58.282] Chunk #1 of 2 ... DONE [15:31:58.282] Chunk #2 of 2 ... [15:31:58.282] - Finding globals in 'X' for chunk #2 ... [15:31:58.283] getGlobalsAndPackages() ... [15:31:58.283] Searching for globals... [15:31:58.284] [15:31:58.284] Searching for globals ... DONE [15:31:58.285] - globals: [0] [15:31:58.285] getGlobalsAndPackages() ... DONE [15:31:58.285] + additional globals found: [n=0] [15:31:58.285] + additional namespaces needed: [n=0] [15:31:58.286] - Finding globals in 'X' for chunk #2 ... DONE [15:31:58.286] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:58.286] - seeds: [15:31:58.287] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.287] getGlobalsAndPackages() ... [15:31:58.287] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.287] Resolving globals: FALSE [15:31:58.288] Tweak future expression to call with '...' arguments ... [15:31:58.288] { [15:31:58.288] do.call(function(...) { [15:31:58.288] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:58.288] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:58.288] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:58.288] on.exit(options(oopts), add = TRUE) [15:31:58.288] } [15:31:58.288] { [15:31:58.288] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:58.288] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:58.288] ...future.FUN(...future.X_jj, ...) [15:31:58.288] }) [15:31:58.288] } [15:31:58.288] }, args = future.call.arguments) [15:31:58.288] } [15:31:58.289] Tweak future expression to call with '...' arguments ... DONE [15:31:58.290] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.290] - packages: [1] 'listenv' [15:31:58.290] getGlobalsAndPackages() ... DONE [15:31:58.291] run() for 'Future' ... [15:31:58.291] - state: 'created' [15:31:58.292] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:58.314] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:58.314] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:58.315] - Field: 'node' [15:31:58.315] - Field: 'label' [15:31:58.315] - Field: 'local' [15:31:58.315] - Field: 'owner' [15:31:58.316] - Field: 'envir' [15:31:58.316] - Field: 'workers' [15:31:58.316] - Field: 'packages' [15:31:58.317] - Field: 'gc' [15:31:58.317] - Field: 'conditions' [15:31:58.317] - Field: 'persistent' [15:31:58.317] - Field: 'expr' [15:31:58.318] - Field: 'uuid' [15:31:58.318] - Field: 'seed' [15:31:58.318] - Field: 'version' [15:31:58.319] - Field: 'result' [15:31:58.319] - Field: 'asynchronous' [15:31:58.319] - Field: 'calls' [15:31:58.319] - Field: 'globals' [15:31:58.320] - Field: 'stdout' [15:31:58.320] - Field: 'earlySignal' [15:31:58.320] - Field: 'lazy' [15:31:58.320] - Field: 'state' [15:31:58.321] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:58.321] - Launch lazy future ... [15:31:58.322] Packages needed by the future expression (n = 1): 'listenv' [15:31:58.322] Packages needed by future strategies (n = 0): [15:31:58.323] { [15:31:58.323] { [15:31:58.323] { [15:31:58.323] ...future.startTime <- base::Sys.time() [15:31:58.323] { [15:31:58.323] { [15:31:58.323] { [15:31:58.323] { [15:31:58.323] { [15:31:58.323] base::local({ [15:31:58.323] has_future <- base::requireNamespace("future", [15:31:58.323] quietly = TRUE) [15:31:58.323] if (has_future) { [15:31:58.323] ns <- base::getNamespace("future") [15:31:58.323] version <- ns[[".package"]][["version"]] [15:31:58.323] if (is.null(version)) [15:31:58.323] version <- utils::packageVersion("future") [15:31:58.323] } [15:31:58.323] else { [15:31:58.323] version <- NULL [15:31:58.323] } [15:31:58.323] if (!has_future || version < "1.8.0") { [15:31:58.323] info <- base::c(r_version = base::gsub("R version ", [15:31:58.323] "", base::R.version$version.string), [15:31:58.323] platform = base::sprintf("%s (%s-bit)", [15:31:58.323] base::R.version$platform, 8 * [15:31:58.323] base::.Machine$sizeof.pointer), [15:31:58.323] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:58.323] "release", "version")], collapse = " "), [15:31:58.323] hostname = base::Sys.info()[["nodename"]]) [15:31:58.323] info <- base::sprintf("%s: %s", base::names(info), [15:31:58.323] info) [15:31:58.323] info <- base::paste(info, collapse = "; ") [15:31:58.323] if (!has_future) { [15:31:58.323] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:58.323] info) [15:31:58.323] } [15:31:58.323] else { [15:31:58.323] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:58.323] info, version) [15:31:58.323] } [15:31:58.323] base::stop(msg) [15:31:58.323] } [15:31:58.323] }) [15:31:58.323] } [15:31:58.323] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:58.323] base::options(mc.cores = 1L) [15:31:58.323] } [15:31:58.323] base::local({ [15:31:58.323] for (pkg in "listenv") { [15:31:58.323] base::loadNamespace(pkg) [15:31:58.323] base::library(pkg, character.only = TRUE) [15:31:58.323] } [15:31:58.323] }) [15:31:58.323] } [15:31:58.323] ...future.strategy.old <- future::plan("list") [15:31:58.323] options(future.plan = NULL) [15:31:58.323] Sys.unsetenv("R_FUTURE_PLAN") [15:31:58.323] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:58.323] } [15:31:58.323] ...future.workdir <- getwd() [15:31:58.323] } [15:31:58.323] ...future.oldOptions <- base::as.list(base::.Options) [15:31:58.323] ...future.oldEnvVars <- base::Sys.getenv() [15:31:58.323] } [15:31:58.323] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:58.323] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:58.323] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:58.323] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:58.323] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:58.323] future.stdout.windows.reencode = NULL, width = 80L) [15:31:58.323] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:58.323] base::names(...future.oldOptions)) [15:31:58.323] } [15:31:58.323] if (FALSE) { [15:31:58.323] } [15:31:58.323] else { [15:31:58.323] if (TRUE) { [15:31:58.323] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:58.323] open = "w") [15:31:58.323] } [15:31:58.323] else { [15:31:58.323] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:58.323] windows = "NUL", "/dev/null"), open = "w") [15:31:58.323] } [15:31:58.323] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:58.323] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:58.323] base::sink(type = "output", split = FALSE) [15:31:58.323] base::close(...future.stdout) [15:31:58.323] }, add = TRUE) [15:31:58.323] } [15:31:58.323] ...future.frame <- base::sys.nframe() [15:31:58.323] ...future.conditions <- base::list() [15:31:58.323] ...future.rng <- base::globalenv()$.Random.seed [15:31:58.323] if (FALSE) { [15:31:58.323] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:58.323] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:58.323] } [15:31:58.323] ...future.result <- base::tryCatch({ [15:31:58.323] base::withCallingHandlers({ [15:31:58.323] ...future.value <- base::withVisible(base::local({ [15:31:58.323] ...future.makeSendCondition <- base::local({ [15:31:58.323] sendCondition <- NULL [15:31:58.323] function(frame = 1L) { [15:31:58.323] if (is.function(sendCondition)) [15:31:58.323] return(sendCondition) [15:31:58.323] ns <- getNamespace("parallel") [15:31:58.323] if (exists("sendData", mode = "function", [15:31:58.323] envir = ns)) { [15:31:58.323] parallel_sendData <- get("sendData", mode = "function", [15:31:58.323] envir = ns) [15:31:58.323] envir <- sys.frame(frame) [15:31:58.323] master <- NULL [15:31:58.323] while (!identical(envir, .GlobalEnv) && [15:31:58.323] !identical(envir, emptyenv())) { [15:31:58.323] if (exists("master", mode = "list", envir = envir, [15:31:58.323] inherits = FALSE)) { [15:31:58.323] master <- get("master", mode = "list", [15:31:58.323] envir = envir, inherits = FALSE) [15:31:58.323] if (inherits(master, c("SOCKnode", [15:31:58.323] "SOCK0node"))) { [15:31:58.323] sendCondition <<- function(cond) { [15:31:58.323] data <- list(type = "VALUE", value = cond, [15:31:58.323] success = TRUE) [15:31:58.323] parallel_sendData(master, data) [15:31:58.323] } [15:31:58.323] return(sendCondition) [15:31:58.323] } [15:31:58.323] } [15:31:58.323] frame <- frame + 1L [15:31:58.323] envir <- sys.frame(frame) [15:31:58.323] } [15:31:58.323] } [15:31:58.323] sendCondition <<- function(cond) NULL [15:31:58.323] } [15:31:58.323] }) [15:31:58.323] withCallingHandlers({ [15:31:58.323] { [15:31:58.323] do.call(function(...) { [15:31:58.323] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:58.323] if (!identical(...future.globals.maxSize.org, [15:31:58.323] ...future.globals.maxSize)) { [15:31:58.323] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:58.323] on.exit(options(oopts), add = TRUE) [15:31:58.323] } [15:31:58.323] { [15:31:58.323] lapply(seq_along(...future.elements_ii), [15:31:58.323] FUN = function(jj) { [15:31:58.323] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:58.323] ...future.FUN(...future.X_jj, ...) [15:31:58.323] }) [15:31:58.323] } [15:31:58.323] }, args = future.call.arguments) [15:31:58.323] } [15:31:58.323] }, immediateCondition = function(cond) { [15:31:58.323] sendCondition <- ...future.makeSendCondition() [15:31:58.323] sendCondition(cond) [15:31:58.323] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.323] { [15:31:58.323] inherits <- base::inherits [15:31:58.323] invokeRestart <- base::invokeRestart [15:31:58.323] is.null <- base::is.null [15:31:58.323] muffled <- FALSE [15:31:58.323] if (inherits(cond, "message")) { [15:31:58.323] muffled <- grepl(pattern, "muffleMessage") [15:31:58.323] if (muffled) [15:31:58.323] invokeRestart("muffleMessage") [15:31:58.323] } [15:31:58.323] else if (inherits(cond, "warning")) { [15:31:58.323] muffled <- grepl(pattern, "muffleWarning") [15:31:58.323] if (muffled) [15:31:58.323] invokeRestart("muffleWarning") [15:31:58.323] } [15:31:58.323] else if (inherits(cond, "condition")) { [15:31:58.323] if (!is.null(pattern)) { [15:31:58.323] computeRestarts <- base::computeRestarts [15:31:58.323] grepl <- base::grepl [15:31:58.323] restarts <- computeRestarts(cond) [15:31:58.323] for (restart in restarts) { [15:31:58.323] name <- restart$name [15:31:58.323] if (is.null(name)) [15:31:58.323] next [15:31:58.323] if (!grepl(pattern, name)) [15:31:58.323] next [15:31:58.323] invokeRestart(restart) [15:31:58.323] muffled <- TRUE [15:31:58.323] break [15:31:58.323] } [15:31:58.323] } [15:31:58.323] } [15:31:58.323] invisible(muffled) [15:31:58.323] } [15:31:58.323] muffleCondition(cond) [15:31:58.323] }) [15:31:58.323] })) [15:31:58.323] future::FutureResult(value = ...future.value$value, [15:31:58.323] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:58.323] ...future.rng), globalenv = if (FALSE) [15:31:58.323] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:58.323] ...future.globalenv.names)) [15:31:58.323] else NULL, started = ...future.startTime, version = "1.8") [15:31:58.323] }, condition = base::local({ [15:31:58.323] c <- base::c [15:31:58.323] inherits <- base::inherits [15:31:58.323] invokeRestart <- base::invokeRestart [15:31:58.323] length <- base::length [15:31:58.323] list <- base::list [15:31:58.323] seq.int <- base::seq.int [15:31:58.323] signalCondition <- base::signalCondition [15:31:58.323] sys.calls <- base::sys.calls [15:31:58.323] `[[` <- base::`[[` [15:31:58.323] `+` <- base::`+` [15:31:58.323] `<<-` <- base::`<<-` [15:31:58.323] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:58.323] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:58.323] 3L)] [15:31:58.323] } [15:31:58.323] function(cond) { [15:31:58.323] is_error <- inherits(cond, "error") [15:31:58.323] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:58.323] NULL) [15:31:58.323] if (is_error) { [15:31:58.323] sessionInformation <- function() { [15:31:58.323] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:58.323] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:58.323] search = base::search(), system = base::Sys.info()) [15:31:58.323] } [15:31:58.323] ...future.conditions[[length(...future.conditions) + [15:31:58.323] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:58.323] cond$call), session = sessionInformation(), [15:31:58.323] timestamp = base::Sys.time(), signaled = 0L) [15:31:58.323] signalCondition(cond) [15:31:58.323] } [15:31:58.323] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:58.323] "immediateCondition"))) { [15:31:58.323] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:58.323] ...future.conditions[[length(...future.conditions) + [15:31:58.323] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:58.323] if (TRUE && !signal) { [15:31:58.323] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.323] { [15:31:58.323] inherits <- base::inherits [15:31:58.323] invokeRestart <- base::invokeRestart [15:31:58.323] is.null <- base::is.null [15:31:58.323] muffled <- FALSE [15:31:58.323] if (inherits(cond, "message")) { [15:31:58.323] muffled <- grepl(pattern, "muffleMessage") [15:31:58.323] if (muffled) [15:31:58.323] invokeRestart("muffleMessage") [15:31:58.323] } [15:31:58.323] else if (inherits(cond, "warning")) { [15:31:58.323] muffled <- grepl(pattern, "muffleWarning") [15:31:58.323] if (muffled) [15:31:58.323] invokeRestart("muffleWarning") [15:31:58.323] } [15:31:58.323] else if (inherits(cond, "condition")) { [15:31:58.323] if (!is.null(pattern)) { [15:31:58.323] computeRestarts <- base::computeRestarts [15:31:58.323] grepl <- base::grepl [15:31:58.323] restarts <- computeRestarts(cond) [15:31:58.323] for (restart in restarts) { [15:31:58.323] name <- restart$name [15:31:58.323] if (is.null(name)) [15:31:58.323] next [15:31:58.323] if (!grepl(pattern, name)) [15:31:58.323] next [15:31:58.323] invokeRestart(restart) [15:31:58.323] muffled <- TRUE [15:31:58.323] break [15:31:58.323] } [15:31:58.323] } [15:31:58.323] } [15:31:58.323] invisible(muffled) [15:31:58.323] } [15:31:58.323] muffleCondition(cond, pattern = "^muffle") [15:31:58.323] } [15:31:58.323] } [15:31:58.323] else { [15:31:58.323] if (TRUE) { [15:31:58.323] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.323] { [15:31:58.323] inherits <- base::inherits [15:31:58.323] invokeRestart <- base::invokeRestart [15:31:58.323] is.null <- base::is.null [15:31:58.323] muffled <- FALSE [15:31:58.323] if (inherits(cond, "message")) { [15:31:58.323] muffled <- grepl(pattern, "muffleMessage") [15:31:58.323] if (muffled) [15:31:58.323] invokeRestart("muffleMessage") [15:31:58.323] } [15:31:58.323] else if (inherits(cond, "warning")) { [15:31:58.323] muffled <- grepl(pattern, "muffleWarning") [15:31:58.323] if (muffled) [15:31:58.323] invokeRestart("muffleWarning") [15:31:58.323] } [15:31:58.323] else if (inherits(cond, "condition")) { [15:31:58.323] if (!is.null(pattern)) { [15:31:58.323] computeRestarts <- base::computeRestarts [15:31:58.323] grepl <- base::grepl [15:31:58.323] restarts <- computeRestarts(cond) [15:31:58.323] for (restart in restarts) { [15:31:58.323] name <- restart$name [15:31:58.323] if (is.null(name)) [15:31:58.323] next [15:31:58.323] if (!grepl(pattern, name)) [15:31:58.323] next [15:31:58.323] invokeRestart(restart) [15:31:58.323] muffled <- TRUE [15:31:58.323] break [15:31:58.323] } [15:31:58.323] } [15:31:58.323] } [15:31:58.323] invisible(muffled) [15:31:58.323] } [15:31:58.323] muffleCondition(cond, pattern = "^muffle") [15:31:58.323] } [15:31:58.323] } [15:31:58.323] } [15:31:58.323] })) [15:31:58.323] }, error = function(ex) { [15:31:58.323] base::structure(base::list(value = NULL, visible = NULL, [15:31:58.323] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:58.323] ...future.rng), started = ...future.startTime, [15:31:58.323] finished = Sys.time(), session_uuid = NA_character_, [15:31:58.323] version = "1.8"), class = "FutureResult") [15:31:58.323] }, finally = { [15:31:58.323] if (!identical(...future.workdir, getwd())) [15:31:58.323] setwd(...future.workdir) [15:31:58.323] { [15:31:58.323] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:58.323] ...future.oldOptions$nwarnings <- NULL [15:31:58.323] } [15:31:58.323] base::options(...future.oldOptions) [15:31:58.323] if (.Platform$OS.type == "windows") { [15:31:58.323] old_names <- names(...future.oldEnvVars) [15:31:58.323] envs <- base::Sys.getenv() [15:31:58.323] names <- names(envs) [15:31:58.323] common <- intersect(names, old_names) [15:31:58.323] added <- setdiff(names, old_names) [15:31:58.323] removed <- setdiff(old_names, names) [15:31:58.323] changed <- common[...future.oldEnvVars[common] != [15:31:58.323] envs[common]] [15:31:58.323] NAMES <- toupper(changed) [15:31:58.323] args <- list() [15:31:58.323] for (kk in seq_along(NAMES)) { [15:31:58.323] name <- changed[[kk]] [15:31:58.323] NAME <- NAMES[[kk]] [15:31:58.323] if (name != NAME && is.element(NAME, old_names)) [15:31:58.323] next [15:31:58.323] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:58.323] } [15:31:58.323] NAMES <- toupper(added) [15:31:58.323] for (kk in seq_along(NAMES)) { [15:31:58.323] name <- added[[kk]] [15:31:58.323] NAME <- NAMES[[kk]] [15:31:58.323] if (name != NAME && is.element(NAME, old_names)) [15:31:58.323] next [15:31:58.323] args[[name]] <- "" [15:31:58.323] } [15:31:58.323] NAMES <- toupper(removed) [15:31:58.323] for (kk in seq_along(NAMES)) { [15:31:58.323] name <- removed[[kk]] [15:31:58.323] NAME <- NAMES[[kk]] [15:31:58.323] if (name != NAME && is.element(NAME, old_names)) [15:31:58.323] next [15:31:58.323] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:58.323] } [15:31:58.323] if (length(args) > 0) [15:31:58.323] base::do.call(base::Sys.setenv, args = args) [15:31:58.323] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:58.323] } [15:31:58.323] else { [15:31:58.323] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:58.323] } [15:31:58.323] { [15:31:58.323] if (base::length(...future.futureOptionsAdded) > [15:31:58.323] 0L) { [15:31:58.323] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:58.323] base::names(opts) <- ...future.futureOptionsAdded [15:31:58.323] base::options(opts) [15:31:58.323] } [15:31:58.323] { [15:31:58.323] { [15:31:58.323] base::options(mc.cores = ...future.mc.cores.old) [15:31:58.323] NULL [15:31:58.323] } [15:31:58.323] options(future.plan = NULL) [15:31:58.323] if (is.na(NA_character_)) [15:31:58.323] Sys.unsetenv("R_FUTURE_PLAN") [15:31:58.323] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:58.323] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:58.323] .init = FALSE) [15:31:58.323] } [15:31:58.323] } [15:31:58.323] } [15:31:58.323] }) [15:31:58.323] if (TRUE) { [15:31:58.323] base::sink(type = "output", split = FALSE) [15:31:58.323] if (TRUE) { [15:31:58.323] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:58.323] } [15:31:58.323] else { [15:31:58.323] ...future.result["stdout"] <- base::list(NULL) [15:31:58.323] } [15:31:58.323] base::close(...future.stdout) [15:31:58.323] ...future.stdout <- NULL [15:31:58.323] } [15:31:58.323] ...future.result$conditions <- ...future.conditions [15:31:58.323] ...future.result$finished <- base::Sys.time() [15:31:58.323] ...future.result [15:31:58.323] } [15:31:58.333] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... [15:31:58.333] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... [15:31:58.334] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... DONE [15:31:58.334] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [15:31:58.335] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [15:31:58.335] Exporting '...future.elements_ii' (12.94 KiB) to cluster node #1 ... [15:31:58.336] Exporting '...future.elements_ii' (12.94 KiB) to cluster node #1 ... DONE [15:31:58.336] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:58.337] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:58.338] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:58.338] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:58.339] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... DONE [15:31:58.340] MultisessionFuture started [15:31:58.340] - Launch lazy future ... done [15:31:58.340] run() for 'MultisessionFuture' ... done [15:31:58.340] Created future: [15:31:58.359] receiveMessageFromWorker() for ClusterFuture ... [15:31:58.360] - Validating connection of MultisessionFuture [15:31:58.361] - received message: FutureResult [15:31:58.361] - Received FutureResult [15:31:58.361] - Erased future from FutureRegistry [15:31:58.362] result() for ClusterFuture ... [15:31:58.362] - result already collected: FutureResult [15:31:58.362] result() for ClusterFuture ... done [15:31:58.362] receiveMessageFromWorker() for ClusterFuture ... done [15:31:58.341] MultisessionFuture: [15:31:58.341] Label: 'future_lapply-2' [15:31:58.341] Expression: [15:31:58.341] { [15:31:58.341] do.call(function(...) { [15:31:58.341] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:58.341] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:58.341] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:58.341] on.exit(options(oopts), add = TRUE) [15:31:58.341] } [15:31:58.341] { [15:31:58.341] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:58.341] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:58.341] ...future.FUN(...future.X_jj, ...) [15:31:58.341] }) [15:31:58.341] } [15:31:58.341] }, args = future.call.arguments) [15:31:58.341] } [15:31:58.341] Lazy evaluation: FALSE [15:31:58.341] Asynchronous evaluation: TRUE [15:31:58.341] Local evaluation: TRUE [15:31:58.341] Environment: R_GlobalEnv [15:31:58.341] Capture standard output: TRUE [15:31:58.341] Capture condition classes: 'condition' (excluding 'nothing') [15:31:58.341] Globals: 5 objects totaling 17.79 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 12.94 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:58.341] Packages: 1 packages ('listenv') [15:31:58.341] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:58.341] Resolved: TRUE [15:31:58.341] Value: [15:31:58.341] Conditions captured: [15:31:58.341] Early signaling: FALSE [15:31:58.341] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:58.341] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:58.363] Chunk #2 of 2 ... DONE [15:31:58.363] Launching 2 futures (chunks) ... DONE [15:31:58.364] Resolving 2 futures (chunks) ... [15:31:58.364] resolve() on list ... [15:31:58.364] recursive: 0 [15:31:58.365] length: 2 [15:31:58.365] [15:31:58.365] Future #1 [15:31:58.366] result() for ClusterFuture ... [15:31:58.366] - result already collected: FutureResult [15:31:58.366] result() for ClusterFuture ... done [15:31:58.366] result() for ClusterFuture ... [15:31:58.367] - result already collected: FutureResult [15:31:58.367] result() for ClusterFuture ... done [15:31:58.367] signalConditionsASAP(MultisessionFuture, pos=1) ... [15:31:58.368] - nx: 2 [15:31:58.368] - relay: TRUE [15:31:58.368] - stdout: TRUE [15:31:58.368] - signal: TRUE [15:31:58.369] - resignal: FALSE [15:31:58.369] - force: TRUE [15:31:58.369] - relayed: [n=2] FALSE, FALSE [15:31:58.370] - queued futures: [n=2] FALSE, FALSE [15:31:58.370] - until=1 [15:31:58.370] - relaying element #1 [15:31:58.370] result() for ClusterFuture ... [15:31:58.371] - result already collected: FutureResult [15:31:58.371] result() for ClusterFuture ... done [15:31:58.371] result() for ClusterFuture ... [15:31:58.371] - result already collected: FutureResult [15:31:58.372] result() for ClusterFuture ... done [15:31:58.372] result() for ClusterFuture ... [15:31:58.372] - result already collected: FutureResult [15:31:58.373] result() for ClusterFuture ... done [15:31:58.373] result() for ClusterFuture ... [15:31:58.373] - result already collected: FutureResult [15:31:58.373] result() for ClusterFuture ... done [15:31:58.374] - relayed: [n=2] TRUE, FALSE [15:31:58.374] - queued futures: [n=2] TRUE, FALSE [15:31:58.374] signalConditionsASAP(MultisessionFuture, pos=1) ... done [15:31:58.375] length: 1 (resolved future 1) [15:31:58.375] Future #2 [15:31:58.375] result() for ClusterFuture ... [15:31:58.375] - result already collected: FutureResult [15:31:58.376] result() for ClusterFuture ... done [15:31:58.376] result() for ClusterFuture ... [15:31:58.376] - result already collected: FutureResult [15:31:58.377] result() for ClusterFuture ... done [15:31:58.377] signalConditionsASAP(MultisessionFuture, pos=2) ... [15:31:58.377] - nx: 2 [15:31:58.377] - relay: TRUE [15:31:58.378] - stdout: TRUE [15:31:58.378] - signal: TRUE [15:31:58.378] - resignal: FALSE [15:31:58.378] - force: TRUE [15:31:58.379] - relayed: [n=2] TRUE, FALSE [15:31:58.379] - queued futures: [n=2] TRUE, FALSE [15:31:58.380] - until=2 [15:31:58.380] - relaying element #2 [15:31:58.380] result() for ClusterFuture ... [15:31:58.381] - result already collected: FutureResult [15:31:58.381] result() for ClusterFuture ... done [15:31:58.382] result() for ClusterFuture ... [15:31:58.382] - result already collected: FutureResult [15:31:58.382] result() for ClusterFuture ... done [15:31:58.383] result() for ClusterFuture ... [15:31:58.383] - result already collected: FutureResult [15:31:58.383] result() for ClusterFuture ... done [15:31:58.384] result() for ClusterFuture ... [15:31:58.384] - result already collected: FutureResult [15:31:58.384] result() for ClusterFuture ... done [15:31:58.385] - relayed: [n=2] TRUE, TRUE [15:31:58.385] - queued futures: [n=2] TRUE, TRUE [15:31:58.385] signalConditionsASAP(MultisessionFuture, pos=2) ... done [15:31:58.386] length: 0 (resolved future 2) [15:31:58.386] Relaying remaining futures [15:31:58.386] signalConditionsASAP(NULL, pos=0) ... [15:31:58.386] - nx: 2 [15:31:58.387] - relay: TRUE [15:31:58.387] - stdout: TRUE [15:31:58.387] - signal: TRUE [15:31:58.388] - resignal: FALSE [15:31:58.388] - force: TRUE [15:31:58.388] - relayed: [n=2] TRUE, TRUE [15:31:58.389] - queued futures: [n=2] TRUE, TRUE - flush all [15:31:58.389] - relayed: [n=2] TRUE, TRUE [15:31:58.390] - queued futures: [n=2] TRUE, TRUE [15:31:58.390] signalConditionsASAP(NULL, pos=0) ... done [15:31:58.390] resolve() on list ... DONE [15:31:58.391] result() for ClusterFuture ... [15:31:58.391] - result already collected: FutureResult [15:31:58.391] result() for ClusterFuture ... done [15:31:58.391] result() for ClusterFuture ... [15:31:58.392] - result already collected: FutureResult [15:31:58.392] result() for ClusterFuture ... done [15:31:58.393] result() for ClusterFuture ... [15:31:58.393] - result already collected: FutureResult [15:31:58.393] result() for ClusterFuture ... done [15:31:58.394] result() for ClusterFuture ... [15:31:58.394] - result already collected: FutureResult [15:31:58.394] result() for ClusterFuture ... done [15:31:58.395] - Number of value chunks collected: 2 [15:31:58.395] Resolving 2 futures (chunks) ... DONE [15:31:58.395] Reducing values from 2 chunks ... [15:31:58.396] - Number of values collected after concatenation: 2 [15:31:58.396] - Number of values expected: 2 [15:31:58.396] Reducing values from 2 chunks ... DONE [15:31:58.397] 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, ...) ... [15:31:58.401] future_lapply() ... [15:31:58.407] Number of chunks: 2 [15:31:58.407] Index remapping (attribute 'ordering'): [n = 4] 3, 4, 2, 1 [15:31:58.408] getGlobalsAndPackagesXApply() ... [15:31:58.408] - future.globals: TRUE [15:31:58.408] getGlobalsAndPackages() ... [15:31:58.409] Searching for globals... [15:31:58.411] - globals found: [2] 'FUN', '.Internal' [15:31:58.411] Searching for globals ... DONE [15:31:58.412] Resolving globals: FALSE [15:31:58.412] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:58.413] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:58.413] - globals: [1] 'FUN' [15:31:58.414] [15:31:58.414] getGlobalsAndPackages() ... DONE [15:31:58.414] - globals found/used: [n=1] 'FUN' [15:31:58.414] - needed namespaces: [n=0] [15:31:58.415] Finding globals ... DONE [15:31:58.415] - use_args: TRUE [15:31:58.415] - Getting '...' globals ... [15:31:58.416] resolve() on list ... [15:31:58.416] recursive: 0 [15:31:58.416] length: 1 [15:31:58.417] elements: '...' [15:31:58.417] length: 0 (resolved future 1) [15:31:58.417] resolve() on list ... DONE [15:31:58.417] - '...' content: [n=1] 'length' [15:31:58.418] List of 1 [15:31:58.418] $ ...:List of 1 [15:31:58.418] ..$ length: int 2 [15:31:58.418] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:58.418] - attr(*, "where")=List of 1 [15:31:58.418] ..$ ...: [15:31:58.418] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:58.418] - attr(*, "resolved")= logi TRUE [15:31:58.418] - attr(*, "total_size")= num NA [15:31:58.423] - Getting '...' globals ... DONE [15:31:58.424] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:58.424] List of 2 [15:31:58.424] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:58.424] $ ... :List of 1 [15:31:58.424] ..$ length: int 2 [15:31:58.424] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:58.424] - attr(*, "where")=List of 2 [15:31:58.424] ..$ ...future.FUN: [15:31:58.424] ..$ ... : [15:31:58.424] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:58.424] - attr(*, "resolved")= logi FALSE [15:31:58.424] - attr(*, "total_size")= num 2240 [15:31:58.430] Packages to be attached in all futures: [n=0] [15:31:58.430] getGlobalsAndPackagesXApply() ... DONE [15:31:58.430] Number of futures (= number of chunks): 2 [15:31:58.431] Launching 2 futures (chunks) ... [15:31:58.431] Chunk #1 of 2 ... [15:31:58.431] - Finding globals in 'X' for chunk #1 ... [15:31:58.432] getGlobalsAndPackages() ... [15:31:58.432] Searching for globals... [15:31:58.432] [15:31:58.433] Searching for globals ... DONE [15:31:58.433] - globals: [0] [15:31:58.433] getGlobalsAndPackages() ... DONE [15:31:58.433] + additional globals found: [n=0] [15:31:58.434] + additional namespaces needed: [n=0] [15:31:58.434] - Finding globals in 'X' for chunk #1 ... DONE [15:31:58.434] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:58.435] - seeds: [15:31:58.435] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.435] getGlobalsAndPackages() ... [15:31:58.436] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.436] Resolving globals: FALSE [15:31:58.436] Tweak future expression to call with '...' arguments ... [15:31:58.437] { [15:31:58.437] do.call(function(...) { [15:31:58.437] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:58.437] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:58.437] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:58.437] on.exit(options(oopts), add = TRUE) [15:31:58.437] } [15:31:58.437] { [15:31:58.437] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:58.437] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:58.437] ...future.FUN(...future.X_jj, ...) [15:31:58.437] }) [15:31:58.437] } [15:31:58.437] }, args = future.call.arguments) [15:31:58.437] } [15:31:58.437] Tweak future expression to call with '...' arguments ... DONE [15:31:58.438] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.438] [15:31:58.439] getGlobalsAndPackages() ... DONE [15:31:58.439] run() for 'Future' ... [15:31:58.440] - state: 'created' [15:31:58.440] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:58.457] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:58.458] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:58.458] - Field: 'node' [15:31:58.458] - Field: 'label' [15:31:58.459] - Field: 'local' [15:31:58.459] - Field: 'owner' [15:31:58.459] - Field: 'envir' [15:31:58.460] - Field: 'workers' [15:31:58.460] - Field: 'packages' [15:31:58.460] - Field: 'gc' [15:31:58.461] - Field: 'conditions' [15:31:58.461] - Field: 'persistent' [15:31:58.461] - Field: 'expr' [15:31:58.462] - Field: 'uuid' [15:31:58.462] - Field: 'seed' [15:31:58.462] - Field: 'version' [15:31:58.463] - Field: 'result' [15:31:58.463] - Field: 'asynchronous' [15:31:58.463] - Field: 'calls' [15:31:58.463] - Field: 'globals' [15:31:58.464] - Field: 'stdout' [15:31:58.464] - Field: 'earlySignal' [15:31:58.464] - Field: 'lazy' [15:31:58.465] - Field: 'state' [15:31:58.465] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:58.465] - Launch lazy future ... [15:31:58.466] Packages needed by the future expression (n = 0): [15:31:58.466] Packages needed by future strategies (n = 0): [15:31:58.467] { [15:31:58.467] { [15:31:58.467] { [15:31:58.467] ...future.startTime <- base::Sys.time() [15:31:58.467] { [15:31:58.467] { [15:31:58.467] { [15:31:58.467] { [15:31:58.467] base::local({ [15:31:58.467] has_future <- base::requireNamespace("future", [15:31:58.467] quietly = TRUE) [15:31:58.467] if (has_future) { [15:31:58.467] ns <- base::getNamespace("future") [15:31:58.467] version <- ns[[".package"]][["version"]] [15:31:58.467] if (is.null(version)) [15:31:58.467] version <- utils::packageVersion("future") [15:31:58.467] } [15:31:58.467] else { [15:31:58.467] version <- NULL [15:31:58.467] } [15:31:58.467] if (!has_future || version < "1.8.0") { [15:31:58.467] info <- base::c(r_version = base::gsub("R version ", [15:31:58.467] "", base::R.version$version.string), [15:31:58.467] platform = base::sprintf("%s (%s-bit)", [15:31:58.467] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:58.467] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:58.467] "release", "version")], collapse = " "), [15:31:58.467] hostname = base::Sys.info()[["nodename"]]) [15:31:58.467] info <- base::sprintf("%s: %s", base::names(info), [15:31:58.467] info) [15:31:58.467] info <- base::paste(info, collapse = "; ") [15:31:58.467] if (!has_future) { [15:31:58.467] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:58.467] info) [15:31:58.467] } [15:31:58.467] else { [15:31:58.467] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:58.467] info, version) [15:31:58.467] } [15:31:58.467] base::stop(msg) [15:31:58.467] } [15:31:58.467] }) [15:31:58.467] } [15:31:58.467] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:58.467] base::options(mc.cores = 1L) [15:31:58.467] } [15:31:58.467] ...future.strategy.old <- future::plan("list") [15:31:58.467] options(future.plan = NULL) [15:31:58.467] Sys.unsetenv("R_FUTURE_PLAN") [15:31:58.467] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:58.467] } [15:31:58.467] ...future.workdir <- getwd() [15:31:58.467] } [15:31:58.467] ...future.oldOptions <- base::as.list(base::.Options) [15:31:58.467] ...future.oldEnvVars <- base::Sys.getenv() [15:31:58.467] } [15:31:58.467] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:58.467] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:58.467] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:58.467] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:58.467] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:58.467] future.stdout.windows.reencode = NULL, width = 80L) [15:31:58.467] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:58.467] base::names(...future.oldOptions)) [15:31:58.467] } [15:31:58.467] if (FALSE) { [15:31:58.467] } [15:31:58.467] else { [15:31:58.467] if (TRUE) { [15:31:58.467] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:58.467] open = "w") [15:31:58.467] } [15:31:58.467] else { [15:31:58.467] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:58.467] windows = "NUL", "/dev/null"), open = "w") [15:31:58.467] } [15:31:58.467] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:58.467] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:58.467] base::sink(type = "output", split = FALSE) [15:31:58.467] base::close(...future.stdout) [15:31:58.467] }, add = TRUE) [15:31:58.467] } [15:31:58.467] ...future.frame <- base::sys.nframe() [15:31:58.467] ...future.conditions <- base::list() [15:31:58.467] ...future.rng <- base::globalenv()$.Random.seed [15:31:58.467] if (FALSE) { [15:31:58.467] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:58.467] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:58.467] } [15:31:58.467] ...future.result <- base::tryCatch({ [15:31:58.467] base::withCallingHandlers({ [15:31:58.467] ...future.value <- base::withVisible(base::local({ [15:31:58.467] ...future.makeSendCondition <- base::local({ [15:31:58.467] sendCondition <- NULL [15:31:58.467] function(frame = 1L) { [15:31:58.467] if (is.function(sendCondition)) [15:31:58.467] return(sendCondition) [15:31:58.467] ns <- getNamespace("parallel") [15:31:58.467] if (exists("sendData", mode = "function", [15:31:58.467] envir = ns)) { [15:31:58.467] parallel_sendData <- get("sendData", mode = "function", [15:31:58.467] envir = ns) [15:31:58.467] envir <- sys.frame(frame) [15:31:58.467] master <- NULL [15:31:58.467] while (!identical(envir, .GlobalEnv) && [15:31:58.467] !identical(envir, emptyenv())) { [15:31:58.467] if (exists("master", mode = "list", envir = envir, [15:31:58.467] inherits = FALSE)) { [15:31:58.467] master <- get("master", mode = "list", [15:31:58.467] envir = envir, inherits = FALSE) [15:31:58.467] if (inherits(master, c("SOCKnode", [15:31:58.467] "SOCK0node"))) { [15:31:58.467] sendCondition <<- function(cond) { [15:31:58.467] data <- list(type = "VALUE", value = cond, [15:31:58.467] success = TRUE) [15:31:58.467] parallel_sendData(master, data) [15:31:58.467] } [15:31:58.467] return(sendCondition) [15:31:58.467] } [15:31:58.467] } [15:31:58.467] frame <- frame + 1L [15:31:58.467] envir <- sys.frame(frame) [15:31:58.467] } [15:31:58.467] } [15:31:58.467] sendCondition <<- function(cond) NULL [15:31:58.467] } [15:31:58.467] }) [15:31:58.467] withCallingHandlers({ [15:31:58.467] { [15:31:58.467] do.call(function(...) { [15:31:58.467] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:58.467] if (!identical(...future.globals.maxSize.org, [15:31:58.467] ...future.globals.maxSize)) { [15:31:58.467] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:58.467] on.exit(options(oopts), add = TRUE) [15:31:58.467] } [15:31:58.467] { [15:31:58.467] lapply(seq_along(...future.elements_ii), [15:31:58.467] FUN = function(jj) { [15:31:58.467] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:58.467] ...future.FUN(...future.X_jj, ...) [15:31:58.467] }) [15:31:58.467] } [15:31:58.467] }, args = future.call.arguments) [15:31:58.467] } [15:31:58.467] }, immediateCondition = function(cond) { [15:31:58.467] sendCondition <- ...future.makeSendCondition() [15:31:58.467] sendCondition(cond) [15:31:58.467] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.467] { [15:31:58.467] inherits <- base::inherits [15:31:58.467] invokeRestart <- base::invokeRestart [15:31:58.467] is.null <- base::is.null [15:31:58.467] muffled <- FALSE [15:31:58.467] if (inherits(cond, "message")) { [15:31:58.467] muffled <- grepl(pattern, "muffleMessage") [15:31:58.467] if (muffled) [15:31:58.467] invokeRestart("muffleMessage") [15:31:58.467] } [15:31:58.467] else if (inherits(cond, "warning")) { [15:31:58.467] muffled <- grepl(pattern, "muffleWarning") [15:31:58.467] if (muffled) [15:31:58.467] invokeRestart("muffleWarning") [15:31:58.467] } [15:31:58.467] else if (inherits(cond, "condition")) { [15:31:58.467] if (!is.null(pattern)) { [15:31:58.467] computeRestarts <- base::computeRestarts [15:31:58.467] grepl <- base::grepl [15:31:58.467] restarts <- computeRestarts(cond) [15:31:58.467] for (restart in restarts) { [15:31:58.467] name <- restart$name [15:31:58.467] if (is.null(name)) [15:31:58.467] next [15:31:58.467] if (!grepl(pattern, name)) [15:31:58.467] next [15:31:58.467] invokeRestart(restart) [15:31:58.467] muffled <- TRUE [15:31:58.467] break [15:31:58.467] } [15:31:58.467] } [15:31:58.467] } [15:31:58.467] invisible(muffled) [15:31:58.467] } [15:31:58.467] muffleCondition(cond) [15:31:58.467] }) [15:31:58.467] })) [15:31:58.467] future::FutureResult(value = ...future.value$value, [15:31:58.467] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:58.467] ...future.rng), globalenv = if (FALSE) [15:31:58.467] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:58.467] ...future.globalenv.names)) [15:31:58.467] else NULL, started = ...future.startTime, version = "1.8") [15:31:58.467] }, condition = base::local({ [15:31:58.467] c <- base::c [15:31:58.467] inherits <- base::inherits [15:31:58.467] invokeRestart <- base::invokeRestart [15:31:58.467] length <- base::length [15:31:58.467] list <- base::list [15:31:58.467] seq.int <- base::seq.int [15:31:58.467] signalCondition <- base::signalCondition [15:31:58.467] sys.calls <- base::sys.calls [15:31:58.467] `[[` <- base::`[[` [15:31:58.467] `+` <- base::`+` [15:31:58.467] `<<-` <- base::`<<-` [15:31:58.467] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:58.467] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:58.467] 3L)] [15:31:58.467] } [15:31:58.467] function(cond) { [15:31:58.467] is_error <- inherits(cond, "error") [15:31:58.467] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:58.467] NULL) [15:31:58.467] if (is_error) { [15:31:58.467] sessionInformation <- function() { [15:31:58.467] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:58.467] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:58.467] search = base::search(), system = base::Sys.info()) [15:31:58.467] } [15:31:58.467] ...future.conditions[[length(...future.conditions) + [15:31:58.467] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:58.467] cond$call), session = sessionInformation(), [15:31:58.467] timestamp = base::Sys.time(), signaled = 0L) [15:31:58.467] signalCondition(cond) [15:31:58.467] } [15:31:58.467] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:58.467] "immediateCondition"))) { [15:31:58.467] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:58.467] ...future.conditions[[length(...future.conditions) + [15:31:58.467] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:58.467] if (TRUE && !signal) { [15:31:58.467] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.467] { [15:31:58.467] inherits <- base::inherits [15:31:58.467] invokeRestart <- base::invokeRestart [15:31:58.467] is.null <- base::is.null [15:31:58.467] muffled <- FALSE [15:31:58.467] if (inherits(cond, "message")) { [15:31:58.467] muffled <- grepl(pattern, "muffleMessage") [15:31:58.467] if (muffled) [15:31:58.467] invokeRestart("muffleMessage") [15:31:58.467] } [15:31:58.467] else if (inherits(cond, "warning")) { [15:31:58.467] muffled <- grepl(pattern, "muffleWarning") [15:31:58.467] if (muffled) [15:31:58.467] invokeRestart("muffleWarning") [15:31:58.467] } [15:31:58.467] else if (inherits(cond, "condition")) { [15:31:58.467] if (!is.null(pattern)) { [15:31:58.467] computeRestarts <- base::computeRestarts [15:31:58.467] grepl <- base::grepl [15:31:58.467] restarts <- computeRestarts(cond) [15:31:58.467] for (restart in restarts) { [15:31:58.467] name <- restart$name [15:31:58.467] if (is.null(name)) [15:31:58.467] next [15:31:58.467] if (!grepl(pattern, name)) [15:31:58.467] next [15:31:58.467] invokeRestart(restart) [15:31:58.467] muffled <- TRUE [15:31:58.467] break [15:31:58.467] } [15:31:58.467] } [15:31:58.467] } [15:31:58.467] invisible(muffled) [15:31:58.467] } [15:31:58.467] muffleCondition(cond, pattern = "^muffle") [15:31:58.467] } [15:31:58.467] } [15:31:58.467] else { [15:31:58.467] if (TRUE) { [15:31:58.467] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.467] { [15:31:58.467] inherits <- base::inherits [15:31:58.467] invokeRestart <- base::invokeRestart [15:31:58.467] is.null <- base::is.null [15:31:58.467] muffled <- FALSE [15:31:58.467] if (inherits(cond, "message")) { [15:31:58.467] muffled <- grepl(pattern, "muffleMessage") [15:31:58.467] if (muffled) [15:31:58.467] invokeRestart("muffleMessage") [15:31:58.467] } [15:31:58.467] else if (inherits(cond, "warning")) { [15:31:58.467] muffled <- grepl(pattern, "muffleWarning") [15:31:58.467] if (muffled) [15:31:58.467] invokeRestart("muffleWarning") [15:31:58.467] } [15:31:58.467] else if (inherits(cond, "condition")) { [15:31:58.467] if (!is.null(pattern)) { [15:31:58.467] computeRestarts <- base::computeRestarts [15:31:58.467] grepl <- base::grepl [15:31:58.467] restarts <- computeRestarts(cond) [15:31:58.467] for (restart in restarts) { [15:31:58.467] name <- restart$name [15:31:58.467] if (is.null(name)) [15:31:58.467] next [15:31:58.467] if (!grepl(pattern, name)) [15:31:58.467] next [15:31:58.467] invokeRestart(restart) [15:31:58.467] muffled <- TRUE [15:31:58.467] break [15:31:58.467] } [15:31:58.467] } [15:31:58.467] } [15:31:58.467] invisible(muffled) [15:31:58.467] } [15:31:58.467] muffleCondition(cond, pattern = "^muffle") [15:31:58.467] } [15:31:58.467] } [15:31:58.467] } [15:31:58.467] })) [15:31:58.467] }, error = function(ex) { [15:31:58.467] base::structure(base::list(value = NULL, visible = NULL, [15:31:58.467] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:58.467] ...future.rng), started = ...future.startTime, [15:31:58.467] finished = Sys.time(), session_uuid = NA_character_, [15:31:58.467] version = "1.8"), class = "FutureResult") [15:31:58.467] }, finally = { [15:31:58.467] if (!identical(...future.workdir, getwd())) [15:31:58.467] setwd(...future.workdir) [15:31:58.467] { [15:31:58.467] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:58.467] ...future.oldOptions$nwarnings <- NULL [15:31:58.467] } [15:31:58.467] base::options(...future.oldOptions) [15:31:58.467] if (.Platform$OS.type == "windows") { [15:31:58.467] old_names <- names(...future.oldEnvVars) [15:31:58.467] envs <- base::Sys.getenv() [15:31:58.467] names <- names(envs) [15:31:58.467] common <- intersect(names, old_names) [15:31:58.467] added <- setdiff(names, old_names) [15:31:58.467] removed <- setdiff(old_names, names) [15:31:58.467] changed <- common[...future.oldEnvVars[common] != [15:31:58.467] envs[common]] [15:31:58.467] NAMES <- toupper(changed) [15:31:58.467] args <- list() [15:31:58.467] for (kk in seq_along(NAMES)) { [15:31:58.467] name <- changed[[kk]] [15:31:58.467] NAME <- NAMES[[kk]] [15:31:58.467] if (name != NAME && is.element(NAME, old_names)) [15:31:58.467] next [15:31:58.467] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:58.467] } [15:31:58.467] NAMES <- toupper(added) [15:31:58.467] for (kk in seq_along(NAMES)) { [15:31:58.467] name <- added[[kk]] [15:31:58.467] NAME <- NAMES[[kk]] [15:31:58.467] if (name != NAME && is.element(NAME, old_names)) [15:31:58.467] next [15:31:58.467] args[[name]] <- "" [15:31:58.467] } [15:31:58.467] NAMES <- toupper(removed) [15:31:58.467] for (kk in seq_along(NAMES)) { [15:31:58.467] name <- removed[[kk]] [15:31:58.467] NAME <- NAMES[[kk]] [15:31:58.467] if (name != NAME && is.element(NAME, old_names)) [15:31:58.467] next [15:31:58.467] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:58.467] } [15:31:58.467] if (length(args) > 0) [15:31:58.467] base::do.call(base::Sys.setenv, args = args) [15:31:58.467] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:58.467] } [15:31:58.467] else { [15:31:58.467] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:58.467] } [15:31:58.467] { [15:31:58.467] if (base::length(...future.futureOptionsAdded) > [15:31:58.467] 0L) { [15:31:58.467] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:58.467] base::names(opts) <- ...future.futureOptionsAdded [15:31:58.467] base::options(opts) [15:31:58.467] } [15:31:58.467] { [15:31:58.467] { [15:31:58.467] base::options(mc.cores = ...future.mc.cores.old) [15:31:58.467] NULL [15:31:58.467] } [15:31:58.467] options(future.plan = NULL) [15:31:58.467] if (is.na(NA_character_)) [15:31:58.467] Sys.unsetenv("R_FUTURE_PLAN") [15:31:58.467] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:58.467] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:58.467] .init = FALSE) [15:31:58.467] } [15:31:58.467] } [15:31:58.467] } [15:31:58.467] }) [15:31:58.467] if (TRUE) { [15:31:58.467] base::sink(type = "output", split = FALSE) [15:31:58.467] if (TRUE) { [15:31:58.467] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:58.467] } [15:31:58.467] else { [15:31:58.467] ...future.result["stdout"] <- base::list(NULL) [15:31:58.467] } [15:31:58.467] base::close(...future.stdout) [15:31:58.467] ...future.stdout <- NULL [15:31:58.467] } [15:31:58.467] ...future.result$conditions <- ...future.conditions [15:31:58.467] ...future.result$finished <- base::Sys.time() [15:31:58.467] ...future.result [15:31:58.467] } [15:31:58.476] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:58.476] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:58.477] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:58.478] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:58.478] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:58.479] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... [15:31:58.479] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... DONE [15:31:58.480] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:58.480] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:58.481] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:58.481] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:58.482] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:58.482] MultisessionFuture started [15:31:58.483] - Launch lazy future ... done [15:31:58.483] run() for 'MultisessionFuture' ... done [15:31:58.483] Created future: [15:31:58.511] receiveMessageFromWorker() for ClusterFuture ... [15:31:58.512] - Validating connection of MultisessionFuture [15:31:58.512] - received message: FutureResult [15:31:58.512] - Received FutureResult [15:31:58.513] - Erased future from FutureRegistry [15:31:58.513] result() for ClusterFuture ... [15:31:58.513] - result already collected: FutureResult [15:31:58.514] result() for ClusterFuture ... done [15:31:58.514] receiveMessageFromWorker() for ClusterFuture ... done [15:31:58.484] MultisessionFuture: [15:31:58.484] Label: 'future_lapply-1' [15:31:58.484] Expression: [15:31:58.484] { [15:31:58.484] do.call(function(...) { [15:31:58.484] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:58.484] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:58.484] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:58.484] on.exit(options(oopts), add = TRUE) [15:31:58.484] } [15:31:58.484] { [15:31:58.484] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:58.484] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:58.484] ...future.FUN(...future.X_jj, ...) [15:31:58.484] }) [15:31:58.484] } [15:31:58.484] }, args = future.call.arguments) [15:31:58.484] } [15:31:58.484] Lazy evaluation: FALSE [15:31:58.484] Asynchronous evaluation: TRUE [15:31:58.484] Local evaluation: TRUE [15:31:58.484] Environment: R_GlobalEnv [15:31:58.484] Capture standard output: TRUE [15:31:58.484] Capture condition classes: 'condition' (excluding 'nothing') [15:31:58.484] Globals: 5 objects totaling 2.41 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 232 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:58.484] Packages: [15:31:58.484] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:58.484] Resolved: TRUE [15:31:58.484] Value: [15:31:58.484] Conditions captured: [15:31:58.484] Early signaling: FALSE [15:31:58.484] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:58.484] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:58.515] Chunk #1 of 2 ... DONE [15:31:58.515] Chunk #2 of 2 ... [15:31:58.515] - Finding globals in 'X' for chunk #2 ... [15:31:58.516] getGlobalsAndPackages() ... [15:31:58.516] Searching for globals... [15:31:58.516] [15:31:58.517] Searching for globals ... DONE [15:31:58.517] - globals: [0] [15:31:58.517] getGlobalsAndPackages() ... DONE [15:31:58.518] + additional globals found: [n=0] [15:31:58.518] + additional namespaces needed: [n=0] [15:31:58.518] - Finding globals in 'X' for chunk #2 ... DONE [15:31:58.518] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:58.519] - seeds: [15:31:58.519] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.519] getGlobalsAndPackages() ... [15:31:58.519] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.520] Resolving globals: FALSE [15:31:58.520] Tweak future expression to call with '...' arguments ... [15:31:58.520] { [15:31:58.520] do.call(function(...) { [15:31:58.520] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:58.520] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:58.520] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:58.520] on.exit(options(oopts), add = TRUE) [15:31:58.520] } [15:31:58.520] { [15:31:58.520] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:58.520] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:58.520] ...future.FUN(...future.X_jj, ...) [15:31:58.520] }) [15:31:58.520] } [15:31:58.520] }, args = future.call.arguments) [15:31:58.520] } [15:31:58.521] Tweak future expression to call with '...' arguments ... DONE [15:31:58.522] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.522] [15:31:58.523] getGlobalsAndPackages() ... DONE [15:31:58.523] run() for 'Future' ... [15:31:58.524] - state: 'created' [15:31:58.524] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:58.542] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:58.543] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:58.543] - Field: 'node' [15:31:58.543] - Field: 'label' [15:31:58.544] - Field: 'local' [15:31:58.544] - Field: 'owner' [15:31:58.544] - Field: 'envir' [15:31:58.544] - Field: 'workers' [15:31:58.545] - Field: 'packages' [15:31:58.545] - Field: 'gc' [15:31:58.545] - Field: 'conditions' [15:31:58.546] - Field: 'persistent' [15:31:58.546] - Field: 'expr' [15:31:58.546] - Field: 'uuid' [15:31:58.547] - Field: 'seed' [15:31:58.547] - Field: 'version' [15:31:58.547] - Field: 'result' [15:31:58.547] - Field: 'asynchronous' [15:31:58.548] - Field: 'calls' [15:31:58.548] - Field: 'globals' [15:31:58.548] - Field: 'stdout' [15:31:58.549] - Field: 'earlySignal' [15:31:58.549] - Field: 'lazy' [15:31:58.549] - Field: 'state' [15:31:58.550] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:58.550] - Launch lazy future ... [15:31:58.551] Packages needed by the future expression (n = 0): [15:31:58.551] Packages needed by future strategies (n = 0): [15:31:58.552] { [15:31:58.552] { [15:31:58.552] { [15:31:58.552] ...future.startTime <- base::Sys.time() [15:31:58.552] { [15:31:58.552] { [15:31:58.552] { [15:31:58.552] { [15:31:58.552] base::local({ [15:31:58.552] has_future <- base::requireNamespace("future", [15:31:58.552] quietly = TRUE) [15:31:58.552] if (has_future) { [15:31:58.552] ns <- base::getNamespace("future") [15:31:58.552] version <- ns[[".package"]][["version"]] [15:31:58.552] if (is.null(version)) [15:31:58.552] version <- utils::packageVersion("future") [15:31:58.552] } [15:31:58.552] else { [15:31:58.552] version <- NULL [15:31:58.552] } [15:31:58.552] if (!has_future || version < "1.8.0") { [15:31:58.552] info <- base::c(r_version = base::gsub("R version ", [15:31:58.552] "", base::R.version$version.string), [15:31:58.552] platform = base::sprintf("%s (%s-bit)", [15:31:58.552] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:58.552] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:58.552] "release", "version")], collapse = " "), [15:31:58.552] hostname = base::Sys.info()[["nodename"]]) [15:31:58.552] info <- base::sprintf("%s: %s", base::names(info), [15:31:58.552] info) [15:31:58.552] info <- base::paste(info, collapse = "; ") [15:31:58.552] if (!has_future) { [15:31:58.552] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:58.552] info) [15:31:58.552] } [15:31:58.552] else { [15:31:58.552] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:58.552] info, version) [15:31:58.552] } [15:31:58.552] base::stop(msg) [15:31:58.552] } [15:31:58.552] }) [15:31:58.552] } [15:31:58.552] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:58.552] base::options(mc.cores = 1L) [15:31:58.552] } [15:31:58.552] ...future.strategy.old <- future::plan("list") [15:31:58.552] options(future.plan = NULL) [15:31:58.552] Sys.unsetenv("R_FUTURE_PLAN") [15:31:58.552] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:58.552] } [15:31:58.552] ...future.workdir <- getwd() [15:31:58.552] } [15:31:58.552] ...future.oldOptions <- base::as.list(base::.Options) [15:31:58.552] ...future.oldEnvVars <- base::Sys.getenv() [15:31:58.552] } [15:31:58.552] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:58.552] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:58.552] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:58.552] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:58.552] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:58.552] future.stdout.windows.reencode = NULL, width = 80L) [15:31:58.552] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:58.552] base::names(...future.oldOptions)) [15:31:58.552] } [15:31:58.552] if (FALSE) { [15:31:58.552] } [15:31:58.552] else { [15:31:58.552] if (TRUE) { [15:31:58.552] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:58.552] open = "w") [15:31:58.552] } [15:31:58.552] else { [15:31:58.552] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:58.552] windows = "NUL", "/dev/null"), open = "w") [15:31:58.552] } [15:31:58.552] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:58.552] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:58.552] base::sink(type = "output", split = FALSE) [15:31:58.552] base::close(...future.stdout) [15:31:58.552] }, add = TRUE) [15:31:58.552] } [15:31:58.552] ...future.frame <- base::sys.nframe() [15:31:58.552] ...future.conditions <- base::list() [15:31:58.552] ...future.rng <- base::globalenv()$.Random.seed [15:31:58.552] if (FALSE) { [15:31:58.552] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:58.552] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:58.552] } [15:31:58.552] ...future.result <- base::tryCatch({ [15:31:58.552] base::withCallingHandlers({ [15:31:58.552] ...future.value <- base::withVisible(base::local({ [15:31:58.552] ...future.makeSendCondition <- base::local({ [15:31:58.552] sendCondition <- NULL [15:31:58.552] function(frame = 1L) { [15:31:58.552] if (is.function(sendCondition)) [15:31:58.552] return(sendCondition) [15:31:58.552] ns <- getNamespace("parallel") [15:31:58.552] if (exists("sendData", mode = "function", [15:31:58.552] envir = ns)) { [15:31:58.552] parallel_sendData <- get("sendData", mode = "function", [15:31:58.552] envir = ns) [15:31:58.552] envir <- sys.frame(frame) [15:31:58.552] master <- NULL [15:31:58.552] while (!identical(envir, .GlobalEnv) && [15:31:58.552] !identical(envir, emptyenv())) { [15:31:58.552] if (exists("master", mode = "list", envir = envir, [15:31:58.552] inherits = FALSE)) { [15:31:58.552] master <- get("master", mode = "list", [15:31:58.552] envir = envir, inherits = FALSE) [15:31:58.552] if (inherits(master, c("SOCKnode", [15:31:58.552] "SOCK0node"))) { [15:31:58.552] sendCondition <<- function(cond) { [15:31:58.552] data <- list(type = "VALUE", value = cond, [15:31:58.552] success = TRUE) [15:31:58.552] parallel_sendData(master, data) [15:31:58.552] } [15:31:58.552] return(sendCondition) [15:31:58.552] } [15:31:58.552] } [15:31:58.552] frame <- frame + 1L [15:31:58.552] envir <- sys.frame(frame) [15:31:58.552] } [15:31:58.552] } [15:31:58.552] sendCondition <<- function(cond) NULL [15:31:58.552] } [15:31:58.552] }) [15:31:58.552] withCallingHandlers({ [15:31:58.552] { [15:31:58.552] do.call(function(...) { [15:31:58.552] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:58.552] if (!identical(...future.globals.maxSize.org, [15:31:58.552] ...future.globals.maxSize)) { [15:31:58.552] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:58.552] on.exit(options(oopts), add = TRUE) [15:31:58.552] } [15:31:58.552] { [15:31:58.552] lapply(seq_along(...future.elements_ii), [15:31:58.552] FUN = function(jj) { [15:31:58.552] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:58.552] ...future.FUN(...future.X_jj, ...) [15:31:58.552] }) [15:31:58.552] } [15:31:58.552] }, args = future.call.arguments) [15:31:58.552] } [15:31:58.552] }, immediateCondition = function(cond) { [15:31:58.552] sendCondition <- ...future.makeSendCondition() [15:31:58.552] sendCondition(cond) [15:31:58.552] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.552] { [15:31:58.552] inherits <- base::inherits [15:31:58.552] invokeRestart <- base::invokeRestart [15:31:58.552] is.null <- base::is.null [15:31:58.552] muffled <- FALSE [15:31:58.552] if (inherits(cond, "message")) { [15:31:58.552] muffled <- grepl(pattern, "muffleMessage") [15:31:58.552] if (muffled) [15:31:58.552] invokeRestart("muffleMessage") [15:31:58.552] } [15:31:58.552] else if (inherits(cond, "warning")) { [15:31:58.552] muffled <- grepl(pattern, "muffleWarning") [15:31:58.552] if (muffled) [15:31:58.552] invokeRestart("muffleWarning") [15:31:58.552] } [15:31:58.552] else if (inherits(cond, "condition")) { [15:31:58.552] if (!is.null(pattern)) { [15:31:58.552] computeRestarts <- base::computeRestarts [15:31:58.552] grepl <- base::grepl [15:31:58.552] restarts <- computeRestarts(cond) [15:31:58.552] for (restart in restarts) { [15:31:58.552] name <- restart$name [15:31:58.552] if (is.null(name)) [15:31:58.552] next [15:31:58.552] if (!grepl(pattern, name)) [15:31:58.552] next [15:31:58.552] invokeRestart(restart) [15:31:58.552] muffled <- TRUE [15:31:58.552] break [15:31:58.552] } [15:31:58.552] } [15:31:58.552] } [15:31:58.552] invisible(muffled) [15:31:58.552] } [15:31:58.552] muffleCondition(cond) [15:31:58.552] }) [15:31:58.552] })) [15:31:58.552] future::FutureResult(value = ...future.value$value, [15:31:58.552] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:58.552] ...future.rng), globalenv = if (FALSE) [15:31:58.552] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:58.552] ...future.globalenv.names)) [15:31:58.552] else NULL, started = ...future.startTime, version = "1.8") [15:31:58.552] }, condition = base::local({ [15:31:58.552] c <- base::c [15:31:58.552] inherits <- base::inherits [15:31:58.552] invokeRestart <- base::invokeRestart [15:31:58.552] length <- base::length [15:31:58.552] list <- base::list [15:31:58.552] seq.int <- base::seq.int [15:31:58.552] signalCondition <- base::signalCondition [15:31:58.552] sys.calls <- base::sys.calls [15:31:58.552] `[[` <- base::`[[` [15:31:58.552] `+` <- base::`+` [15:31:58.552] `<<-` <- base::`<<-` [15:31:58.552] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:58.552] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:58.552] 3L)] [15:31:58.552] } [15:31:58.552] function(cond) { [15:31:58.552] is_error <- inherits(cond, "error") [15:31:58.552] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:58.552] NULL) [15:31:58.552] if (is_error) { [15:31:58.552] sessionInformation <- function() { [15:31:58.552] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:58.552] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:58.552] search = base::search(), system = base::Sys.info()) [15:31:58.552] } [15:31:58.552] ...future.conditions[[length(...future.conditions) + [15:31:58.552] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:58.552] cond$call), session = sessionInformation(), [15:31:58.552] timestamp = base::Sys.time(), signaled = 0L) [15:31:58.552] signalCondition(cond) [15:31:58.552] } [15:31:58.552] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:58.552] "immediateCondition"))) { [15:31:58.552] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:58.552] ...future.conditions[[length(...future.conditions) + [15:31:58.552] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:58.552] if (TRUE && !signal) { [15:31:58.552] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.552] { [15:31:58.552] inherits <- base::inherits [15:31:58.552] invokeRestart <- base::invokeRestart [15:31:58.552] is.null <- base::is.null [15:31:58.552] muffled <- FALSE [15:31:58.552] if (inherits(cond, "message")) { [15:31:58.552] muffled <- grepl(pattern, "muffleMessage") [15:31:58.552] if (muffled) [15:31:58.552] invokeRestart("muffleMessage") [15:31:58.552] } [15:31:58.552] else if (inherits(cond, "warning")) { [15:31:58.552] muffled <- grepl(pattern, "muffleWarning") [15:31:58.552] if (muffled) [15:31:58.552] invokeRestart("muffleWarning") [15:31:58.552] } [15:31:58.552] else if (inherits(cond, "condition")) { [15:31:58.552] if (!is.null(pattern)) { [15:31:58.552] computeRestarts <- base::computeRestarts [15:31:58.552] grepl <- base::grepl [15:31:58.552] restarts <- computeRestarts(cond) [15:31:58.552] for (restart in restarts) { [15:31:58.552] name <- restart$name [15:31:58.552] if (is.null(name)) [15:31:58.552] next [15:31:58.552] if (!grepl(pattern, name)) [15:31:58.552] next [15:31:58.552] invokeRestart(restart) [15:31:58.552] muffled <- TRUE [15:31:58.552] break [15:31:58.552] } [15:31:58.552] } [15:31:58.552] } [15:31:58.552] invisible(muffled) [15:31:58.552] } [15:31:58.552] muffleCondition(cond, pattern = "^muffle") [15:31:58.552] } [15:31:58.552] } [15:31:58.552] else { [15:31:58.552] if (TRUE) { [15:31:58.552] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.552] { [15:31:58.552] inherits <- base::inherits [15:31:58.552] invokeRestart <- base::invokeRestart [15:31:58.552] is.null <- base::is.null [15:31:58.552] muffled <- FALSE [15:31:58.552] if (inherits(cond, "message")) { [15:31:58.552] muffled <- grepl(pattern, "muffleMessage") [15:31:58.552] if (muffled) [15:31:58.552] invokeRestart("muffleMessage") [15:31:58.552] } [15:31:58.552] else if (inherits(cond, "warning")) { [15:31:58.552] muffled <- grepl(pattern, "muffleWarning") [15:31:58.552] if (muffled) [15:31:58.552] invokeRestart("muffleWarning") [15:31:58.552] } [15:31:58.552] else if (inherits(cond, "condition")) { [15:31:58.552] if (!is.null(pattern)) { [15:31:58.552] computeRestarts <- base::computeRestarts [15:31:58.552] grepl <- base::grepl [15:31:58.552] restarts <- computeRestarts(cond) [15:31:58.552] for (restart in restarts) { [15:31:58.552] name <- restart$name [15:31:58.552] if (is.null(name)) [15:31:58.552] next [15:31:58.552] if (!grepl(pattern, name)) [15:31:58.552] next [15:31:58.552] invokeRestart(restart) [15:31:58.552] muffled <- TRUE [15:31:58.552] break [15:31:58.552] } [15:31:58.552] } [15:31:58.552] } [15:31:58.552] invisible(muffled) [15:31:58.552] } [15:31:58.552] muffleCondition(cond, pattern = "^muffle") [15:31:58.552] } [15:31:58.552] } [15:31:58.552] } [15:31:58.552] })) [15:31:58.552] }, error = function(ex) { [15:31:58.552] base::structure(base::list(value = NULL, visible = NULL, [15:31:58.552] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:58.552] ...future.rng), started = ...future.startTime, [15:31:58.552] finished = Sys.time(), session_uuid = NA_character_, [15:31:58.552] version = "1.8"), class = "FutureResult") [15:31:58.552] }, finally = { [15:31:58.552] if (!identical(...future.workdir, getwd())) [15:31:58.552] setwd(...future.workdir) [15:31:58.552] { [15:31:58.552] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:58.552] ...future.oldOptions$nwarnings <- NULL [15:31:58.552] } [15:31:58.552] base::options(...future.oldOptions) [15:31:58.552] if (.Platform$OS.type == "windows") { [15:31:58.552] old_names <- names(...future.oldEnvVars) [15:31:58.552] envs <- base::Sys.getenv() [15:31:58.552] names <- names(envs) [15:31:58.552] common <- intersect(names, old_names) [15:31:58.552] added <- setdiff(names, old_names) [15:31:58.552] removed <- setdiff(old_names, names) [15:31:58.552] changed <- common[...future.oldEnvVars[common] != [15:31:58.552] envs[common]] [15:31:58.552] NAMES <- toupper(changed) [15:31:58.552] args <- list() [15:31:58.552] for (kk in seq_along(NAMES)) { [15:31:58.552] name <- changed[[kk]] [15:31:58.552] NAME <- NAMES[[kk]] [15:31:58.552] if (name != NAME && is.element(NAME, old_names)) [15:31:58.552] next [15:31:58.552] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:58.552] } [15:31:58.552] NAMES <- toupper(added) [15:31:58.552] for (kk in seq_along(NAMES)) { [15:31:58.552] name <- added[[kk]] [15:31:58.552] NAME <- NAMES[[kk]] [15:31:58.552] if (name != NAME && is.element(NAME, old_names)) [15:31:58.552] next [15:31:58.552] args[[name]] <- "" [15:31:58.552] } [15:31:58.552] NAMES <- toupper(removed) [15:31:58.552] for (kk in seq_along(NAMES)) { [15:31:58.552] name <- removed[[kk]] [15:31:58.552] NAME <- NAMES[[kk]] [15:31:58.552] if (name != NAME && is.element(NAME, old_names)) [15:31:58.552] next [15:31:58.552] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:58.552] } [15:31:58.552] if (length(args) > 0) [15:31:58.552] base::do.call(base::Sys.setenv, args = args) [15:31:58.552] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:58.552] } [15:31:58.552] else { [15:31:58.552] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:58.552] } [15:31:58.552] { [15:31:58.552] if (base::length(...future.futureOptionsAdded) > [15:31:58.552] 0L) { [15:31:58.552] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:58.552] base::names(opts) <- ...future.futureOptionsAdded [15:31:58.552] base::options(opts) [15:31:58.552] } [15:31:58.552] { [15:31:58.552] { [15:31:58.552] base::options(mc.cores = ...future.mc.cores.old) [15:31:58.552] NULL [15:31:58.552] } [15:31:58.552] options(future.plan = NULL) [15:31:58.552] if (is.na(NA_character_)) [15:31:58.552] Sys.unsetenv("R_FUTURE_PLAN") [15:31:58.552] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:58.552] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:58.552] .init = FALSE) [15:31:58.552] } [15:31:58.552] } [15:31:58.552] } [15:31:58.552] }) [15:31:58.552] if (TRUE) { [15:31:58.552] base::sink(type = "output", split = FALSE) [15:31:58.552] if (TRUE) { [15:31:58.552] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:58.552] } [15:31:58.552] else { [15:31:58.552] ...future.result["stdout"] <- base::list(NULL) [15:31:58.552] } [15:31:58.552] base::close(...future.stdout) [15:31:58.552] ...future.stdout <- NULL [15:31:58.552] } [15:31:58.552] ...future.result$conditions <- ...future.conditions [15:31:58.552] ...future.result$finished <- base::Sys.time() [15:31:58.552] ...future.result [15:31:58.552] } [15:31:58.561] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:58.562] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:58.562] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:58.563] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:58.563] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:58.564] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... [15:31:58.564] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... DONE [15:31:58.565] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:58.566] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:58.566] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:58.567] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:58.567] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:58.568] MultisessionFuture started [15:31:58.569] - Launch lazy future ... done [15:31:58.569] run() for 'MultisessionFuture' ... done [15:31:58.570] Created future: [15:31:58.594] receiveMessageFromWorker() for ClusterFuture ... [15:31:58.594] - Validating connection of MultisessionFuture [15:31:58.595] - received message: FutureResult [15:31:58.595] - Received FutureResult [15:31:58.595] - Erased future from FutureRegistry [15:31:58.595] result() for ClusterFuture ... [15:31:58.595] - result already collected: FutureResult [15:31:58.596] result() for ClusterFuture ... done [15:31:58.596] receiveMessageFromWorker() for ClusterFuture ... done [15:31:58.570] MultisessionFuture: [15:31:58.570] Label: 'future_lapply-2' [15:31:58.570] Expression: [15:31:58.570] { [15:31:58.570] do.call(function(...) { [15:31:58.570] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:58.570] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:58.570] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:58.570] on.exit(options(oopts), add = TRUE) [15:31:58.570] } [15:31:58.570] { [15:31:58.570] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:58.570] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:58.570] ...future.FUN(...future.X_jj, ...) [15:31:58.570] }) [15:31:58.570] } [15:31:58.570] }, args = future.call.arguments) [15:31:58.570] } [15:31:58.570] Lazy evaluation: FALSE [15:31:58.570] Asynchronous evaluation: TRUE [15:31:58.570] Local evaluation: TRUE [15:31:58.570] Environment: R_GlobalEnv [15:31:58.570] Capture standard output: TRUE [15:31:58.570] Capture condition classes: 'condition' (excluding 'nothing') [15:31:58.570] Globals: 5 objects totaling 2.41 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 224 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:58.570] Packages: [15:31:58.570] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:58.570] Resolved: TRUE [15:31:58.570] Value: [15:31:58.570] Conditions captured: [15:31:58.570] Early signaling: FALSE [15:31:58.570] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:58.570] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:58.596] Chunk #2 of 2 ... DONE [15:31:58.597] Launching 2 futures (chunks) ... DONE [15:31:58.597] Resolving 2 futures (chunks) ... [15:31:58.597] resolve() on list ... [15:31:58.597] recursive: 0 [15:31:58.597] length: 2 [15:31:58.598] [15:31:58.598] Future #1 [15:31:58.598] result() for ClusterFuture ... [15:31:58.598] - result already collected: FutureResult [15:31:58.598] result() for ClusterFuture ... done [15:31:58.599] result() for ClusterFuture ... [15:31:58.599] - result already collected: FutureResult [15:31:58.599] result() for ClusterFuture ... done [15:31:58.599] signalConditionsASAP(MultisessionFuture, pos=1) ... [15:31:58.599] - nx: 2 [15:31:58.600] - relay: TRUE [15:31:58.600] - stdout: TRUE [15:31:58.600] - signal: TRUE [15:31:58.600] - resignal: FALSE [15:31:58.600] - force: TRUE [15:31:58.600] - relayed: [n=2] FALSE, FALSE [15:31:58.601] - queued futures: [n=2] FALSE, FALSE [15:31:58.601] - until=1 [15:31:58.601] - relaying element #1 [15:31:58.601] result() for ClusterFuture ... [15:31:58.601] - result already collected: FutureResult [15:31:58.601] result() for ClusterFuture ... done [15:31:58.602] result() for ClusterFuture ... [15:31:58.602] - result already collected: FutureResult [15:31:58.602] result() for ClusterFuture ... done [15:31:58.602] result() for ClusterFuture ... [15:31:58.602] - result already collected: FutureResult [15:31:58.603] result() for ClusterFuture ... done [15:31:58.603] result() for ClusterFuture ... [15:31:58.603] - result already collected: FutureResult [15:31:58.603] result() for ClusterFuture ... done [15:31:58.603] - relayed: [n=2] TRUE, FALSE [15:31:58.603] - queued futures: [n=2] TRUE, FALSE [15:31:58.604] signalConditionsASAP(MultisessionFuture, pos=1) ... done [15:31:58.604] length: 1 (resolved future 1) [15:31:58.604] Future #2 [15:31:58.605] result() for ClusterFuture ... [15:31:58.605] - result already collected: FutureResult [15:31:58.605] result() for ClusterFuture ... done [15:31:58.605] result() for ClusterFuture ... [15:31:58.606] - result already collected: FutureResult [15:31:58.606] result() for ClusterFuture ... done [15:31:58.606] signalConditionsASAP(MultisessionFuture, pos=2) ... [15:31:58.606] - nx: 2 [15:31:58.607] - relay: TRUE [15:31:58.607] - stdout: TRUE [15:31:58.607] - signal: TRUE [15:31:58.607] - resignal: FALSE [15:31:58.607] - force: TRUE [15:31:58.607] - relayed: [n=2] TRUE, FALSE [15:31:58.608] - queued futures: [n=2] TRUE, FALSE [15:31:58.608] - until=2 [15:31:58.608] - relaying element #2 [15:31:58.608] result() for ClusterFuture ... [15:31:58.609] - result already collected: FutureResult [15:31:58.609] result() for ClusterFuture ... done [15:31:58.609] result() for ClusterFuture ... [15:31:58.609] - result already collected: FutureResult [15:31:58.609] result() for ClusterFuture ... done [15:31:58.610] result() for ClusterFuture ... [15:31:58.615] - result already collected: FutureResult [15:31:58.615] result() for ClusterFuture ... done [15:31:58.615] result() for ClusterFuture ... [15:31:58.616] - result already collected: FutureResult [15:31:58.616] result() for ClusterFuture ... done [15:31:58.616] - relayed: [n=2] TRUE, TRUE [15:31:58.616] - queued futures: [n=2] TRUE, TRUE [15:31:58.616] signalConditionsASAP(MultisessionFuture, pos=2) ... done [15:31:58.616] length: 0 (resolved future 2) [15:31:58.617] Relaying remaining futures [15:31:58.617] signalConditionsASAP(NULL, pos=0) ... [15:31:58.617] - nx: 2 [15:31:58.617] - relay: TRUE [15:31:58.617] - stdout: TRUE [15:31:58.617] - signal: TRUE [15:31:58.618] - resignal: FALSE [15:31:58.618] - force: TRUE [15:31:58.618] - relayed: [n=2] TRUE, TRUE [15:31:58.618] - queued futures: [n=2] TRUE, TRUE - flush all [15:31:58.618] - relayed: [n=2] TRUE, TRUE [15:31:58.619] - queued futures: [n=2] TRUE, TRUE [15:31:58.619] signalConditionsASAP(NULL, pos=0) ... done [15:31:58.619] resolve() on list ... DONE [15:31:58.619] result() for ClusterFuture ... [15:31:58.619] - result already collected: FutureResult [15:31:58.619] result() for ClusterFuture ... done [15:31:58.620] result() for ClusterFuture ... [15:31:58.620] - result already collected: FutureResult [15:31:58.620] result() for ClusterFuture ... done [15:31:58.620] result() for ClusterFuture ... [15:31:58.620] - result already collected: FutureResult [15:31:58.621] result() for ClusterFuture ... done [15:31:58.621] result() for ClusterFuture ... [15:31:58.621] - result already collected: FutureResult [15:31:58.621] result() for ClusterFuture ... done [15:31:58.621] - Number of value chunks collected: 2 [15:31:58.622] Resolving 2 futures (chunks) ... DONE [15:31:58.622] Reducing values from 2 chunks ... [15:31:58.622] - Number of values collected after concatenation: 4 [15:31:58.622] - Number of values expected: 4 [15:31:58.622] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 1, 2 [15:31:58.622] Reducing values from 2 chunks ... DONE [15:31:58.623] 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 [15:31:58.626] future_lapply() ... [15:31:58.631] Number of chunks: 2 [15:31:58.631] Index remapping (attribute 'ordering'): [n = 4] 2, 3, 4, 1 [15:31:58.631] getGlobalsAndPackagesXApply() ... [15:31:58.632] - future.globals: TRUE [15:31:58.632] getGlobalsAndPackages() ... [15:31:58.632] Searching for globals... [15:31:58.635] - globals found: [2] 'FUN', '.Internal' [15:31:58.636] Searching for globals ... DONE [15:31:58.636] Resolving globals: FALSE [15:31:58.637] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:58.638] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:58.638] - globals: [1] 'FUN' [15:31:58.638] [15:31:58.639] getGlobalsAndPackages() ... DONE [15:31:58.639] - globals found/used: [n=1] 'FUN' [15:31:58.639] - needed namespaces: [n=0] [15:31:58.640] Finding globals ... DONE [15:31:58.640] - use_args: TRUE [15:31:58.640] - Getting '...' globals ... [15:31:58.641] resolve() on list ... [15:31:58.641] recursive: 0 [15:31:58.642] length: 1 [15:31:58.642] elements: '...' [15:31:58.642] length: 0 (resolved future 1) [15:31:58.643] resolve() on list ... DONE [15:31:58.643] - '...' content: [n=1] 'length' [15:31:58.643] List of 1 [15:31:58.643] $ ...:List of 1 [15:31:58.643] ..$ length: int 2 [15:31:58.643] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:58.643] - attr(*, "where")=List of 1 [15:31:58.643] ..$ ...: [15:31:58.643] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:58.643] - attr(*, "resolved")= logi TRUE [15:31:58.643] - attr(*, "total_size")= num NA [15:31:58.650] - Getting '...' globals ... DONE [15:31:58.651] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:58.651] List of 2 [15:31:58.651] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:58.651] $ ... :List of 1 [15:31:58.651] ..$ length: int 2 [15:31:58.651] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:58.651] - attr(*, "where")=List of 2 [15:31:58.651] ..$ ...future.FUN: [15:31:58.651] ..$ ... : [15:31:58.651] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:58.651] - attr(*, "resolved")= logi FALSE [15:31:58.651] - attr(*, "total_size")= num 2240 [15:31:58.657] Packages to be attached in all futures: [n=0] [15:31:58.658] getGlobalsAndPackagesXApply() ... DONE [15:31:58.658] Number of futures (= number of chunks): 2 [15:31:58.659] Launching 2 futures (chunks) ... [15:31:58.659] Chunk #1 of 2 ... [15:31:58.659] - Finding globals in 'X' for chunk #1 ... [15:31:58.660] getGlobalsAndPackages() ... [15:31:58.660] Searching for globals... [15:31:58.661] [15:31:58.661] Searching for globals ... DONE [15:31:58.661] - globals: [0] [15:31:58.662] getGlobalsAndPackages() ... DONE [15:31:58.662] + additional globals found: [n=0] [15:31:58.662] + additional namespaces needed: [n=0] [15:31:58.662] - Finding globals in 'X' for chunk #1 ... DONE [15:31:58.663] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:58.663] - seeds: [15:31:58.663] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.664] getGlobalsAndPackages() ... [15:31:58.664] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.664] Resolving globals: FALSE [15:31:58.664] Tweak future expression to call with '...' arguments ... [15:31:58.665] { [15:31:58.665] do.call(function(...) { [15:31:58.665] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:58.665] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:58.665] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:58.665] on.exit(options(oopts), add = TRUE) [15:31:58.665] } [15:31:58.665] { [15:31:58.665] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:58.665] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:58.665] ...future.FUN(...future.X_jj, ...) [15:31:58.665] }) [15:31:58.665] } [15:31:58.665] }, args = future.call.arguments) [15:31:58.665] } [15:31:58.666] Tweak future expression to call with '...' arguments ... DONE [15:31:58.666] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.667] [15:31:58.667] getGlobalsAndPackages() ... DONE [15:31:58.668] run() for 'Future' ... [15:31:58.668] - state: 'created' [15:31:58.668] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:58.689] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:58.690] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:58.690] - Field: 'node' [15:31:58.691] - Field: 'label' [15:31:58.691] - Field: 'local' [15:31:58.691] - Field: 'owner' [15:31:58.691] - Field: 'envir' [15:31:58.692] - Field: 'workers' [15:31:58.692] - Field: 'packages' [15:31:58.692] - Field: 'gc' [15:31:58.693] - Field: 'conditions' [15:31:58.693] - Field: 'persistent' [15:31:58.693] - Field: 'expr' [15:31:58.694] - Field: 'uuid' [15:31:58.694] - Field: 'seed' [15:31:58.694] - Field: 'version' [15:31:58.695] - Field: 'result' [15:31:58.695] - Field: 'asynchronous' [15:31:58.695] - Field: 'calls' [15:31:58.695] - Field: 'globals' [15:31:58.696] - Field: 'stdout' [15:31:58.696] - Field: 'earlySignal' [15:31:58.696] - Field: 'lazy' [15:31:58.697] - Field: 'state' [15:31:58.697] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:58.697] - Launch lazy future ... [15:31:58.698] Packages needed by the future expression (n = 0): [15:31:58.698] Packages needed by future strategies (n = 0): [15:31:58.699] { [15:31:58.699] { [15:31:58.699] { [15:31:58.699] ...future.startTime <- base::Sys.time() [15:31:58.699] { [15:31:58.699] { [15:31:58.699] { [15:31:58.699] { [15:31:58.699] base::local({ [15:31:58.699] has_future <- base::requireNamespace("future", [15:31:58.699] quietly = TRUE) [15:31:58.699] if (has_future) { [15:31:58.699] ns <- base::getNamespace("future") [15:31:58.699] version <- ns[[".package"]][["version"]] [15:31:58.699] if (is.null(version)) [15:31:58.699] version <- utils::packageVersion("future") [15:31:58.699] } [15:31:58.699] else { [15:31:58.699] version <- NULL [15:31:58.699] } [15:31:58.699] if (!has_future || version < "1.8.0") { [15:31:58.699] info <- base::c(r_version = base::gsub("R version ", [15:31:58.699] "", base::R.version$version.string), [15:31:58.699] platform = base::sprintf("%s (%s-bit)", [15:31:58.699] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:58.699] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:58.699] "release", "version")], collapse = " "), [15:31:58.699] hostname = base::Sys.info()[["nodename"]]) [15:31:58.699] info <- base::sprintf("%s: %s", base::names(info), [15:31:58.699] info) [15:31:58.699] info <- base::paste(info, collapse = "; ") [15:31:58.699] if (!has_future) { [15:31:58.699] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:58.699] info) [15:31:58.699] } [15:31:58.699] else { [15:31:58.699] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:58.699] info, version) [15:31:58.699] } [15:31:58.699] base::stop(msg) [15:31:58.699] } [15:31:58.699] }) [15:31:58.699] } [15:31:58.699] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:58.699] base::options(mc.cores = 1L) [15:31:58.699] } [15:31:58.699] ...future.strategy.old <- future::plan("list") [15:31:58.699] options(future.plan = NULL) [15:31:58.699] Sys.unsetenv("R_FUTURE_PLAN") [15:31:58.699] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:58.699] } [15:31:58.699] ...future.workdir <- getwd() [15:31:58.699] } [15:31:58.699] ...future.oldOptions <- base::as.list(base::.Options) [15:31:58.699] ...future.oldEnvVars <- base::Sys.getenv() [15:31:58.699] } [15:31:58.699] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:58.699] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:58.699] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:58.699] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:58.699] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:58.699] future.stdout.windows.reencode = NULL, width = 80L) [15:31:58.699] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:58.699] base::names(...future.oldOptions)) [15:31:58.699] } [15:31:58.699] if (FALSE) { [15:31:58.699] } [15:31:58.699] else { [15:31:58.699] if (TRUE) { [15:31:58.699] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:58.699] open = "w") [15:31:58.699] } [15:31:58.699] else { [15:31:58.699] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:58.699] windows = "NUL", "/dev/null"), open = "w") [15:31:58.699] } [15:31:58.699] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:58.699] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:58.699] base::sink(type = "output", split = FALSE) [15:31:58.699] base::close(...future.stdout) [15:31:58.699] }, add = TRUE) [15:31:58.699] } [15:31:58.699] ...future.frame <- base::sys.nframe() [15:31:58.699] ...future.conditions <- base::list() [15:31:58.699] ...future.rng <- base::globalenv()$.Random.seed [15:31:58.699] if (FALSE) { [15:31:58.699] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:58.699] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:58.699] } [15:31:58.699] ...future.result <- base::tryCatch({ [15:31:58.699] base::withCallingHandlers({ [15:31:58.699] ...future.value <- base::withVisible(base::local({ [15:31:58.699] ...future.makeSendCondition <- base::local({ [15:31:58.699] sendCondition <- NULL [15:31:58.699] function(frame = 1L) { [15:31:58.699] if (is.function(sendCondition)) [15:31:58.699] return(sendCondition) [15:31:58.699] ns <- getNamespace("parallel") [15:31:58.699] if (exists("sendData", mode = "function", [15:31:58.699] envir = ns)) { [15:31:58.699] parallel_sendData <- get("sendData", mode = "function", [15:31:58.699] envir = ns) [15:31:58.699] envir <- sys.frame(frame) [15:31:58.699] master <- NULL [15:31:58.699] while (!identical(envir, .GlobalEnv) && [15:31:58.699] !identical(envir, emptyenv())) { [15:31:58.699] if (exists("master", mode = "list", envir = envir, [15:31:58.699] inherits = FALSE)) { [15:31:58.699] master <- get("master", mode = "list", [15:31:58.699] envir = envir, inherits = FALSE) [15:31:58.699] if (inherits(master, c("SOCKnode", [15:31:58.699] "SOCK0node"))) { [15:31:58.699] sendCondition <<- function(cond) { [15:31:58.699] data <- list(type = "VALUE", value = cond, [15:31:58.699] success = TRUE) [15:31:58.699] parallel_sendData(master, data) [15:31:58.699] } [15:31:58.699] return(sendCondition) [15:31:58.699] } [15:31:58.699] } [15:31:58.699] frame <- frame + 1L [15:31:58.699] envir <- sys.frame(frame) [15:31:58.699] } [15:31:58.699] } [15:31:58.699] sendCondition <<- function(cond) NULL [15:31:58.699] } [15:31:58.699] }) [15:31:58.699] withCallingHandlers({ [15:31:58.699] { [15:31:58.699] do.call(function(...) { [15:31:58.699] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:58.699] if (!identical(...future.globals.maxSize.org, [15:31:58.699] ...future.globals.maxSize)) { [15:31:58.699] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:58.699] on.exit(options(oopts), add = TRUE) [15:31:58.699] } [15:31:58.699] { [15:31:58.699] lapply(seq_along(...future.elements_ii), [15:31:58.699] FUN = function(jj) { [15:31:58.699] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:58.699] ...future.FUN(...future.X_jj, ...) [15:31:58.699] }) [15:31:58.699] } [15:31:58.699] }, args = future.call.arguments) [15:31:58.699] } [15:31:58.699] }, immediateCondition = function(cond) { [15:31:58.699] sendCondition <- ...future.makeSendCondition() [15:31:58.699] sendCondition(cond) [15:31:58.699] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.699] { [15:31:58.699] inherits <- base::inherits [15:31:58.699] invokeRestart <- base::invokeRestart [15:31:58.699] is.null <- base::is.null [15:31:58.699] muffled <- FALSE [15:31:58.699] if (inherits(cond, "message")) { [15:31:58.699] muffled <- grepl(pattern, "muffleMessage") [15:31:58.699] if (muffled) [15:31:58.699] invokeRestart("muffleMessage") [15:31:58.699] } [15:31:58.699] else if (inherits(cond, "warning")) { [15:31:58.699] muffled <- grepl(pattern, "muffleWarning") [15:31:58.699] if (muffled) [15:31:58.699] invokeRestart("muffleWarning") [15:31:58.699] } [15:31:58.699] else if (inherits(cond, "condition")) { [15:31:58.699] if (!is.null(pattern)) { [15:31:58.699] computeRestarts <- base::computeRestarts [15:31:58.699] grepl <- base::grepl [15:31:58.699] restarts <- computeRestarts(cond) [15:31:58.699] for (restart in restarts) { [15:31:58.699] name <- restart$name [15:31:58.699] if (is.null(name)) [15:31:58.699] next [15:31:58.699] if (!grepl(pattern, name)) [15:31:58.699] next [15:31:58.699] invokeRestart(restart) [15:31:58.699] muffled <- TRUE [15:31:58.699] break [15:31:58.699] } [15:31:58.699] } [15:31:58.699] } [15:31:58.699] invisible(muffled) [15:31:58.699] } [15:31:58.699] muffleCondition(cond) [15:31:58.699] }) [15:31:58.699] })) [15:31:58.699] future::FutureResult(value = ...future.value$value, [15:31:58.699] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:58.699] ...future.rng), globalenv = if (FALSE) [15:31:58.699] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:58.699] ...future.globalenv.names)) [15:31:58.699] else NULL, started = ...future.startTime, version = "1.8") [15:31:58.699] }, condition = base::local({ [15:31:58.699] c <- base::c [15:31:58.699] inherits <- base::inherits [15:31:58.699] invokeRestart <- base::invokeRestart [15:31:58.699] length <- base::length [15:31:58.699] list <- base::list [15:31:58.699] seq.int <- base::seq.int [15:31:58.699] signalCondition <- base::signalCondition [15:31:58.699] sys.calls <- base::sys.calls [15:31:58.699] `[[` <- base::`[[` [15:31:58.699] `+` <- base::`+` [15:31:58.699] `<<-` <- base::`<<-` [15:31:58.699] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:58.699] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:58.699] 3L)] [15:31:58.699] } [15:31:58.699] function(cond) { [15:31:58.699] is_error <- inherits(cond, "error") [15:31:58.699] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:58.699] NULL) [15:31:58.699] if (is_error) { [15:31:58.699] sessionInformation <- function() { [15:31:58.699] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:58.699] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:58.699] search = base::search(), system = base::Sys.info()) [15:31:58.699] } [15:31:58.699] ...future.conditions[[length(...future.conditions) + [15:31:58.699] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:58.699] cond$call), session = sessionInformation(), [15:31:58.699] timestamp = base::Sys.time(), signaled = 0L) [15:31:58.699] signalCondition(cond) [15:31:58.699] } [15:31:58.699] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:58.699] "immediateCondition"))) { [15:31:58.699] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:58.699] ...future.conditions[[length(...future.conditions) + [15:31:58.699] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:58.699] if (TRUE && !signal) { [15:31:58.699] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.699] { [15:31:58.699] inherits <- base::inherits [15:31:58.699] invokeRestart <- base::invokeRestart [15:31:58.699] is.null <- base::is.null [15:31:58.699] muffled <- FALSE [15:31:58.699] if (inherits(cond, "message")) { [15:31:58.699] muffled <- grepl(pattern, "muffleMessage") [15:31:58.699] if (muffled) [15:31:58.699] invokeRestart("muffleMessage") [15:31:58.699] } [15:31:58.699] else if (inherits(cond, "warning")) { [15:31:58.699] muffled <- grepl(pattern, "muffleWarning") [15:31:58.699] if (muffled) [15:31:58.699] invokeRestart("muffleWarning") [15:31:58.699] } [15:31:58.699] else if (inherits(cond, "condition")) { [15:31:58.699] if (!is.null(pattern)) { [15:31:58.699] computeRestarts <- base::computeRestarts [15:31:58.699] grepl <- base::grepl [15:31:58.699] restarts <- computeRestarts(cond) [15:31:58.699] for (restart in restarts) { [15:31:58.699] name <- restart$name [15:31:58.699] if (is.null(name)) [15:31:58.699] next [15:31:58.699] if (!grepl(pattern, name)) [15:31:58.699] next [15:31:58.699] invokeRestart(restart) [15:31:58.699] muffled <- TRUE [15:31:58.699] break [15:31:58.699] } [15:31:58.699] } [15:31:58.699] } [15:31:58.699] invisible(muffled) [15:31:58.699] } [15:31:58.699] muffleCondition(cond, pattern = "^muffle") [15:31:58.699] } [15:31:58.699] } [15:31:58.699] else { [15:31:58.699] if (TRUE) { [15:31:58.699] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.699] { [15:31:58.699] inherits <- base::inherits [15:31:58.699] invokeRestart <- base::invokeRestart [15:31:58.699] is.null <- base::is.null [15:31:58.699] muffled <- FALSE [15:31:58.699] if (inherits(cond, "message")) { [15:31:58.699] muffled <- grepl(pattern, "muffleMessage") [15:31:58.699] if (muffled) [15:31:58.699] invokeRestart("muffleMessage") [15:31:58.699] } [15:31:58.699] else if (inherits(cond, "warning")) { [15:31:58.699] muffled <- grepl(pattern, "muffleWarning") [15:31:58.699] if (muffled) [15:31:58.699] invokeRestart("muffleWarning") [15:31:58.699] } [15:31:58.699] else if (inherits(cond, "condition")) { [15:31:58.699] if (!is.null(pattern)) { [15:31:58.699] computeRestarts <- base::computeRestarts [15:31:58.699] grepl <- base::grepl [15:31:58.699] restarts <- computeRestarts(cond) [15:31:58.699] for (restart in restarts) { [15:31:58.699] name <- restart$name [15:31:58.699] if (is.null(name)) [15:31:58.699] next [15:31:58.699] if (!grepl(pattern, name)) [15:31:58.699] next [15:31:58.699] invokeRestart(restart) [15:31:58.699] muffled <- TRUE [15:31:58.699] break [15:31:58.699] } [15:31:58.699] } [15:31:58.699] } [15:31:58.699] invisible(muffled) [15:31:58.699] } [15:31:58.699] muffleCondition(cond, pattern = "^muffle") [15:31:58.699] } [15:31:58.699] } [15:31:58.699] } [15:31:58.699] })) [15:31:58.699] }, error = function(ex) { [15:31:58.699] base::structure(base::list(value = NULL, visible = NULL, [15:31:58.699] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:58.699] ...future.rng), started = ...future.startTime, [15:31:58.699] finished = Sys.time(), session_uuid = NA_character_, [15:31:58.699] version = "1.8"), class = "FutureResult") [15:31:58.699] }, finally = { [15:31:58.699] if (!identical(...future.workdir, getwd())) [15:31:58.699] setwd(...future.workdir) [15:31:58.699] { [15:31:58.699] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:58.699] ...future.oldOptions$nwarnings <- NULL [15:31:58.699] } [15:31:58.699] base::options(...future.oldOptions) [15:31:58.699] if (.Platform$OS.type == "windows") { [15:31:58.699] old_names <- names(...future.oldEnvVars) [15:31:58.699] envs <- base::Sys.getenv() [15:31:58.699] names <- names(envs) [15:31:58.699] common <- intersect(names, old_names) [15:31:58.699] added <- setdiff(names, old_names) [15:31:58.699] removed <- setdiff(old_names, names) [15:31:58.699] changed <- common[...future.oldEnvVars[common] != [15:31:58.699] envs[common]] [15:31:58.699] NAMES <- toupper(changed) [15:31:58.699] args <- list() [15:31:58.699] for (kk in seq_along(NAMES)) { [15:31:58.699] name <- changed[[kk]] [15:31:58.699] NAME <- NAMES[[kk]] [15:31:58.699] if (name != NAME && is.element(NAME, old_names)) [15:31:58.699] next [15:31:58.699] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:58.699] } [15:31:58.699] NAMES <- toupper(added) [15:31:58.699] for (kk in seq_along(NAMES)) { [15:31:58.699] name <- added[[kk]] [15:31:58.699] NAME <- NAMES[[kk]] [15:31:58.699] if (name != NAME && is.element(NAME, old_names)) [15:31:58.699] next [15:31:58.699] args[[name]] <- "" [15:31:58.699] } [15:31:58.699] NAMES <- toupper(removed) [15:31:58.699] for (kk in seq_along(NAMES)) { [15:31:58.699] name <- removed[[kk]] [15:31:58.699] NAME <- NAMES[[kk]] [15:31:58.699] if (name != NAME && is.element(NAME, old_names)) [15:31:58.699] next [15:31:58.699] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:58.699] } [15:31:58.699] if (length(args) > 0) [15:31:58.699] base::do.call(base::Sys.setenv, args = args) [15:31:58.699] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:58.699] } [15:31:58.699] else { [15:31:58.699] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:58.699] } [15:31:58.699] { [15:31:58.699] if (base::length(...future.futureOptionsAdded) > [15:31:58.699] 0L) { [15:31:58.699] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:58.699] base::names(opts) <- ...future.futureOptionsAdded [15:31:58.699] base::options(opts) [15:31:58.699] } [15:31:58.699] { [15:31:58.699] { [15:31:58.699] base::options(mc.cores = ...future.mc.cores.old) [15:31:58.699] NULL [15:31:58.699] } [15:31:58.699] options(future.plan = NULL) [15:31:58.699] if (is.na(NA_character_)) [15:31:58.699] Sys.unsetenv("R_FUTURE_PLAN") [15:31:58.699] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:58.699] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:58.699] .init = FALSE) [15:31:58.699] } [15:31:58.699] } [15:31:58.699] } [15:31:58.699] }) [15:31:58.699] if (TRUE) { [15:31:58.699] base::sink(type = "output", split = FALSE) [15:31:58.699] if (TRUE) { [15:31:58.699] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:58.699] } [15:31:58.699] else { [15:31:58.699] ...future.result["stdout"] <- base::list(NULL) [15:31:58.699] } [15:31:58.699] base::close(...future.stdout) [15:31:58.699] ...future.stdout <- NULL [15:31:58.699] } [15:31:58.699] ...future.result$conditions <- ...future.conditions [15:31:58.699] ...future.result$finished <- base::Sys.time() [15:31:58.699] ...future.result [15:31:58.699] } [15:31:58.709] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:58.710] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:58.711] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:58.712] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:58.713] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:58.713] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... [15:31:58.714] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... DONE [15:31:58.714] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:58.715] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:58.715] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:58.716] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:58.716] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:58.718] MultisessionFuture started [15:31:58.718] - Launch lazy future ... done [15:31:58.718] run() for 'MultisessionFuture' ... done [15:31:58.719] Created future: [15:31:58.770] receiveMessageFromWorker() for ClusterFuture ... [15:31:58.771] - Validating connection of MultisessionFuture [15:31:58.771] - received message: FutureResult [15:31:58.771] - Received FutureResult [15:31:58.772] - Erased future from FutureRegistry [15:31:58.772] result() for ClusterFuture ... [15:31:58.772] - result already collected: FutureResult [15:31:58.772] result() for ClusterFuture ... done [15:31:58.772] receiveMessageFromWorker() for ClusterFuture ... done [15:31:58.719] MultisessionFuture: [15:31:58.719] Label: 'future_lapply-1' [15:31:58.719] Expression: [15:31:58.719] { [15:31:58.719] do.call(function(...) { [15:31:58.719] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:58.719] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:58.719] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:58.719] on.exit(options(oopts), add = TRUE) [15:31:58.719] } [15:31:58.719] { [15:31:58.719] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:58.719] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:58.719] ...future.FUN(...future.X_jj, ...) [15:31:58.719] }) [15:31:58.719] } [15:31:58.719] }, args = future.call.arguments) [15:31:58.719] } [15:31:58.719] Lazy evaluation: FALSE [15:31:58.719] Asynchronous evaluation: TRUE [15:31:58.719] Local evaluation: TRUE [15:31:58.719] Environment: R_GlobalEnv [15:31:58.719] Capture standard output: TRUE [15:31:58.719] Capture condition classes: 'condition' (excluding 'nothing') [15:31:58.719] Globals: 5 objects totaling 2.41 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 232 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:58.719] Packages: [15:31:58.719] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:58.719] Resolved: TRUE [15:31:58.719] Value: [15:31:58.719] Conditions captured: [15:31:58.719] Early signaling: FALSE [15:31:58.719] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:58.719] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:58.773] Chunk #1 of 2 ... DONE [15:31:58.773] Chunk #2 of 2 ... [15:31:58.773] - Finding globals in 'X' for chunk #2 ... [15:31:58.774] getGlobalsAndPackages() ... [15:31:58.774] Searching for globals... [15:31:58.774] [15:31:58.774] Searching for globals ... DONE [15:31:58.775] - globals: [0] [15:31:58.775] getGlobalsAndPackages() ... DONE [15:31:58.775] + additional globals found: [n=0] [15:31:58.775] + additional namespaces needed: [n=0] [15:31:58.776] - Finding globals in 'X' for chunk #2 ... DONE [15:31:58.776] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:58.776] - seeds: [15:31:58.776] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.777] getGlobalsAndPackages() ... [15:31:58.777] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.777] Resolving globals: FALSE [15:31:58.778] Tweak future expression to call with '...' arguments ... [15:31:58.778] { [15:31:58.778] do.call(function(...) { [15:31:58.778] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:58.778] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:58.778] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:58.778] on.exit(options(oopts), add = TRUE) [15:31:58.778] } [15:31:58.778] { [15:31:58.778] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:58.778] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:58.778] ...future.FUN(...future.X_jj, ...) [15:31:58.778] }) [15:31:58.778] } [15:31:58.778] }, args = future.call.arguments) [15:31:58.778] } [15:31:58.779] Tweak future expression to call with '...' arguments ... DONE [15:31:58.779] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.779] [15:31:58.780] getGlobalsAndPackages() ... DONE [15:31:58.780] run() for 'Future' ... [15:31:58.780] - state: 'created' [15:31:58.781] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:58.797] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:58.797] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:58.798] - Field: 'node' [15:31:58.798] - Field: 'label' [15:31:58.798] - Field: 'local' [15:31:58.799] - Field: 'owner' [15:31:58.799] - Field: 'envir' [15:31:58.799] - Field: 'workers' [15:31:58.800] - Field: 'packages' [15:31:58.800] - Field: 'gc' [15:31:58.800] - Field: 'conditions' [15:31:58.801] - Field: 'persistent' [15:31:58.801] - Field: 'expr' [15:31:58.801] - Field: 'uuid' [15:31:58.801] - Field: 'seed' [15:31:58.802] - Field: 'version' [15:31:58.802] - Field: 'result' [15:31:58.802] - Field: 'asynchronous' [15:31:58.803] - Field: 'calls' [15:31:58.803] - Field: 'globals' [15:31:58.803] - Field: 'stdout' [15:31:58.804] - Field: 'earlySignal' [15:31:58.804] - Field: 'lazy' [15:31:58.804] - Field: 'state' [15:31:58.805] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:58.805] - Launch lazy future ... [15:31:58.806] Packages needed by the future expression (n = 0): [15:31:58.806] Packages needed by future strategies (n = 0): [15:31:58.807] { [15:31:58.807] { [15:31:58.807] { [15:31:58.807] ...future.startTime <- base::Sys.time() [15:31:58.807] { [15:31:58.807] { [15:31:58.807] { [15:31:58.807] { [15:31:58.807] base::local({ [15:31:58.807] has_future <- base::requireNamespace("future", [15:31:58.807] quietly = TRUE) [15:31:58.807] if (has_future) { [15:31:58.807] ns <- base::getNamespace("future") [15:31:58.807] version <- ns[[".package"]][["version"]] [15:31:58.807] if (is.null(version)) [15:31:58.807] version <- utils::packageVersion("future") [15:31:58.807] } [15:31:58.807] else { [15:31:58.807] version <- NULL [15:31:58.807] } [15:31:58.807] if (!has_future || version < "1.8.0") { [15:31:58.807] info <- base::c(r_version = base::gsub("R version ", [15:31:58.807] "", base::R.version$version.string), [15:31:58.807] platform = base::sprintf("%s (%s-bit)", [15:31:58.807] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:58.807] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:58.807] "release", "version")], collapse = " "), [15:31:58.807] hostname = base::Sys.info()[["nodename"]]) [15:31:58.807] info <- base::sprintf("%s: %s", base::names(info), [15:31:58.807] info) [15:31:58.807] info <- base::paste(info, collapse = "; ") [15:31:58.807] if (!has_future) { [15:31:58.807] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:58.807] info) [15:31:58.807] } [15:31:58.807] else { [15:31:58.807] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:58.807] info, version) [15:31:58.807] } [15:31:58.807] base::stop(msg) [15:31:58.807] } [15:31:58.807] }) [15:31:58.807] } [15:31:58.807] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:58.807] base::options(mc.cores = 1L) [15:31:58.807] } [15:31:58.807] ...future.strategy.old <- future::plan("list") [15:31:58.807] options(future.plan = NULL) [15:31:58.807] Sys.unsetenv("R_FUTURE_PLAN") [15:31:58.807] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:58.807] } [15:31:58.807] ...future.workdir <- getwd() [15:31:58.807] } [15:31:58.807] ...future.oldOptions <- base::as.list(base::.Options) [15:31:58.807] ...future.oldEnvVars <- base::Sys.getenv() [15:31:58.807] } [15:31:58.807] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:58.807] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:58.807] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:58.807] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:58.807] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:58.807] future.stdout.windows.reencode = NULL, width = 80L) [15:31:58.807] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:58.807] base::names(...future.oldOptions)) [15:31:58.807] } [15:31:58.807] if (FALSE) { [15:31:58.807] } [15:31:58.807] else { [15:31:58.807] if (TRUE) { [15:31:58.807] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:58.807] open = "w") [15:31:58.807] } [15:31:58.807] else { [15:31:58.807] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:58.807] windows = "NUL", "/dev/null"), open = "w") [15:31:58.807] } [15:31:58.807] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:58.807] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:58.807] base::sink(type = "output", split = FALSE) [15:31:58.807] base::close(...future.stdout) [15:31:58.807] }, add = TRUE) [15:31:58.807] } [15:31:58.807] ...future.frame <- base::sys.nframe() [15:31:58.807] ...future.conditions <- base::list() [15:31:58.807] ...future.rng <- base::globalenv()$.Random.seed [15:31:58.807] if (FALSE) { [15:31:58.807] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:58.807] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:58.807] } [15:31:58.807] ...future.result <- base::tryCatch({ [15:31:58.807] base::withCallingHandlers({ [15:31:58.807] ...future.value <- base::withVisible(base::local({ [15:31:58.807] ...future.makeSendCondition <- base::local({ [15:31:58.807] sendCondition <- NULL [15:31:58.807] function(frame = 1L) { [15:31:58.807] if (is.function(sendCondition)) [15:31:58.807] return(sendCondition) [15:31:58.807] ns <- getNamespace("parallel") [15:31:58.807] if (exists("sendData", mode = "function", [15:31:58.807] envir = ns)) { [15:31:58.807] parallel_sendData <- get("sendData", mode = "function", [15:31:58.807] envir = ns) [15:31:58.807] envir <- sys.frame(frame) [15:31:58.807] master <- NULL [15:31:58.807] while (!identical(envir, .GlobalEnv) && [15:31:58.807] !identical(envir, emptyenv())) { [15:31:58.807] if (exists("master", mode = "list", envir = envir, [15:31:58.807] inherits = FALSE)) { [15:31:58.807] master <- get("master", mode = "list", [15:31:58.807] envir = envir, inherits = FALSE) [15:31:58.807] if (inherits(master, c("SOCKnode", [15:31:58.807] "SOCK0node"))) { [15:31:58.807] sendCondition <<- function(cond) { [15:31:58.807] data <- list(type = "VALUE", value = cond, [15:31:58.807] success = TRUE) [15:31:58.807] parallel_sendData(master, data) [15:31:58.807] } [15:31:58.807] return(sendCondition) [15:31:58.807] } [15:31:58.807] } [15:31:58.807] frame <- frame + 1L [15:31:58.807] envir <- sys.frame(frame) [15:31:58.807] } [15:31:58.807] } [15:31:58.807] sendCondition <<- function(cond) NULL [15:31:58.807] } [15:31:58.807] }) [15:31:58.807] withCallingHandlers({ [15:31:58.807] { [15:31:58.807] do.call(function(...) { [15:31:58.807] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:58.807] if (!identical(...future.globals.maxSize.org, [15:31:58.807] ...future.globals.maxSize)) { [15:31:58.807] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:58.807] on.exit(options(oopts), add = TRUE) [15:31:58.807] } [15:31:58.807] { [15:31:58.807] lapply(seq_along(...future.elements_ii), [15:31:58.807] FUN = function(jj) { [15:31:58.807] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:58.807] ...future.FUN(...future.X_jj, ...) [15:31:58.807] }) [15:31:58.807] } [15:31:58.807] }, args = future.call.arguments) [15:31:58.807] } [15:31:58.807] }, immediateCondition = function(cond) { [15:31:58.807] sendCondition <- ...future.makeSendCondition() [15:31:58.807] sendCondition(cond) [15:31:58.807] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.807] { [15:31:58.807] inherits <- base::inherits [15:31:58.807] invokeRestart <- base::invokeRestart [15:31:58.807] is.null <- base::is.null [15:31:58.807] muffled <- FALSE [15:31:58.807] if (inherits(cond, "message")) { [15:31:58.807] muffled <- grepl(pattern, "muffleMessage") [15:31:58.807] if (muffled) [15:31:58.807] invokeRestart("muffleMessage") [15:31:58.807] } [15:31:58.807] else if (inherits(cond, "warning")) { [15:31:58.807] muffled <- grepl(pattern, "muffleWarning") [15:31:58.807] if (muffled) [15:31:58.807] invokeRestart("muffleWarning") [15:31:58.807] } [15:31:58.807] else if (inherits(cond, "condition")) { [15:31:58.807] if (!is.null(pattern)) { [15:31:58.807] computeRestarts <- base::computeRestarts [15:31:58.807] grepl <- base::grepl [15:31:58.807] restarts <- computeRestarts(cond) [15:31:58.807] for (restart in restarts) { [15:31:58.807] name <- restart$name [15:31:58.807] if (is.null(name)) [15:31:58.807] next [15:31:58.807] if (!grepl(pattern, name)) [15:31:58.807] next [15:31:58.807] invokeRestart(restart) [15:31:58.807] muffled <- TRUE [15:31:58.807] break [15:31:58.807] } [15:31:58.807] } [15:31:58.807] } [15:31:58.807] invisible(muffled) [15:31:58.807] } [15:31:58.807] muffleCondition(cond) [15:31:58.807] }) [15:31:58.807] })) [15:31:58.807] future::FutureResult(value = ...future.value$value, [15:31:58.807] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:58.807] ...future.rng), globalenv = if (FALSE) [15:31:58.807] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:58.807] ...future.globalenv.names)) [15:31:58.807] else NULL, started = ...future.startTime, version = "1.8") [15:31:58.807] }, condition = base::local({ [15:31:58.807] c <- base::c [15:31:58.807] inherits <- base::inherits [15:31:58.807] invokeRestart <- base::invokeRestart [15:31:58.807] length <- base::length [15:31:58.807] list <- base::list [15:31:58.807] seq.int <- base::seq.int [15:31:58.807] signalCondition <- base::signalCondition [15:31:58.807] sys.calls <- base::sys.calls [15:31:58.807] `[[` <- base::`[[` [15:31:58.807] `+` <- base::`+` [15:31:58.807] `<<-` <- base::`<<-` [15:31:58.807] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:58.807] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:58.807] 3L)] [15:31:58.807] } [15:31:58.807] function(cond) { [15:31:58.807] is_error <- inherits(cond, "error") [15:31:58.807] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:58.807] NULL) [15:31:58.807] if (is_error) { [15:31:58.807] sessionInformation <- function() { [15:31:58.807] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:58.807] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:58.807] search = base::search(), system = base::Sys.info()) [15:31:58.807] } [15:31:58.807] ...future.conditions[[length(...future.conditions) + [15:31:58.807] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:58.807] cond$call), session = sessionInformation(), [15:31:58.807] timestamp = base::Sys.time(), signaled = 0L) [15:31:58.807] signalCondition(cond) [15:31:58.807] } [15:31:58.807] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:58.807] "immediateCondition"))) { [15:31:58.807] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:58.807] ...future.conditions[[length(...future.conditions) + [15:31:58.807] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:58.807] if (TRUE && !signal) { [15:31:58.807] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.807] { [15:31:58.807] inherits <- base::inherits [15:31:58.807] invokeRestart <- base::invokeRestart [15:31:58.807] is.null <- base::is.null [15:31:58.807] muffled <- FALSE [15:31:58.807] if (inherits(cond, "message")) { [15:31:58.807] muffled <- grepl(pattern, "muffleMessage") [15:31:58.807] if (muffled) [15:31:58.807] invokeRestart("muffleMessage") [15:31:58.807] } [15:31:58.807] else if (inherits(cond, "warning")) { [15:31:58.807] muffled <- grepl(pattern, "muffleWarning") [15:31:58.807] if (muffled) [15:31:58.807] invokeRestart("muffleWarning") [15:31:58.807] } [15:31:58.807] else if (inherits(cond, "condition")) { [15:31:58.807] if (!is.null(pattern)) { [15:31:58.807] computeRestarts <- base::computeRestarts [15:31:58.807] grepl <- base::grepl [15:31:58.807] restarts <- computeRestarts(cond) [15:31:58.807] for (restart in restarts) { [15:31:58.807] name <- restart$name [15:31:58.807] if (is.null(name)) [15:31:58.807] next [15:31:58.807] if (!grepl(pattern, name)) [15:31:58.807] next [15:31:58.807] invokeRestart(restart) [15:31:58.807] muffled <- TRUE [15:31:58.807] break [15:31:58.807] } [15:31:58.807] } [15:31:58.807] } [15:31:58.807] invisible(muffled) [15:31:58.807] } [15:31:58.807] muffleCondition(cond, pattern = "^muffle") [15:31:58.807] } [15:31:58.807] } [15:31:58.807] else { [15:31:58.807] if (TRUE) { [15:31:58.807] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.807] { [15:31:58.807] inherits <- base::inherits [15:31:58.807] invokeRestart <- base::invokeRestart [15:31:58.807] is.null <- base::is.null [15:31:58.807] muffled <- FALSE [15:31:58.807] if (inherits(cond, "message")) { [15:31:58.807] muffled <- grepl(pattern, "muffleMessage") [15:31:58.807] if (muffled) [15:31:58.807] invokeRestart("muffleMessage") [15:31:58.807] } [15:31:58.807] else if (inherits(cond, "warning")) { [15:31:58.807] muffled <- grepl(pattern, "muffleWarning") [15:31:58.807] if (muffled) [15:31:58.807] invokeRestart("muffleWarning") [15:31:58.807] } [15:31:58.807] else if (inherits(cond, "condition")) { [15:31:58.807] if (!is.null(pattern)) { [15:31:58.807] computeRestarts <- base::computeRestarts [15:31:58.807] grepl <- base::grepl [15:31:58.807] restarts <- computeRestarts(cond) [15:31:58.807] for (restart in restarts) { [15:31:58.807] name <- restart$name [15:31:58.807] if (is.null(name)) [15:31:58.807] next [15:31:58.807] if (!grepl(pattern, name)) [15:31:58.807] next [15:31:58.807] invokeRestart(restart) [15:31:58.807] muffled <- TRUE [15:31:58.807] break [15:31:58.807] } [15:31:58.807] } [15:31:58.807] } [15:31:58.807] invisible(muffled) [15:31:58.807] } [15:31:58.807] muffleCondition(cond, pattern = "^muffle") [15:31:58.807] } [15:31:58.807] } [15:31:58.807] } [15:31:58.807] })) [15:31:58.807] }, error = function(ex) { [15:31:58.807] base::structure(base::list(value = NULL, visible = NULL, [15:31:58.807] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:58.807] ...future.rng), started = ...future.startTime, [15:31:58.807] finished = Sys.time(), session_uuid = NA_character_, [15:31:58.807] version = "1.8"), class = "FutureResult") [15:31:58.807] }, finally = { [15:31:58.807] if (!identical(...future.workdir, getwd())) [15:31:58.807] setwd(...future.workdir) [15:31:58.807] { [15:31:58.807] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:58.807] ...future.oldOptions$nwarnings <- NULL [15:31:58.807] } [15:31:58.807] base::options(...future.oldOptions) [15:31:58.807] if (.Platform$OS.type == "windows") { [15:31:58.807] old_names <- names(...future.oldEnvVars) [15:31:58.807] envs <- base::Sys.getenv() [15:31:58.807] names <- names(envs) [15:31:58.807] common <- intersect(names, old_names) [15:31:58.807] added <- setdiff(names, old_names) [15:31:58.807] removed <- setdiff(old_names, names) [15:31:58.807] changed <- common[...future.oldEnvVars[common] != [15:31:58.807] envs[common]] [15:31:58.807] NAMES <- toupper(changed) [15:31:58.807] args <- list() [15:31:58.807] for (kk in seq_along(NAMES)) { [15:31:58.807] name <- changed[[kk]] [15:31:58.807] NAME <- NAMES[[kk]] [15:31:58.807] if (name != NAME && is.element(NAME, old_names)) [15:31:58.807] next [15:31:58.807] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:58.807] } [15:31:58.807] NAMES <- toupper(added) [15:31:58.807] for (kk in seq_along(NAMES)) { [15:31:58.807] name <- added[[kk]] [15:31:58.807] NAME <- NAMES[[kk]] [15:31:58.807] if (name != NAME && is.element(NAME, old_names)) [15:31:58.807] next [15:31:58.807] args[[name]] <- "" [15:31:58.807] } [15:31:58.807] NAMES <- toupper(removed) [15:31:58.807] for (kk in seq_along(NAMES)) { [15:31:58.807] name <- removed[[kk]] [15:31:58.807] NAME <- NAMES[[kk]] [15:31:58.807] if (name != NAME && is.element(NAME, old_names)) [15:31:58.807] next [15:31:58.807] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:58.807] } [15:31:58.807] if (length(args) > 0) [15:31:58.807] base::do.call(base::Sys.setenv, args = args) [15:31:58.807] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:58.807] } [15:31:58.807] else { [15:31:58.807] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:58.807] } [15:31:58.807] { [15:31:58.807] if (base::length(...future.futureOptionsAdded) > [15:31:58.807] 0L) { [15:31:58.807] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:58.807] base::names(opts) <- ...future.futureOptionsAdded [15:31:58.807] base::options(opts) [15:31:58.807] } [15:31:58.807] { [15:31:58.807] { [15:31:58.807] base::options(mc.cores = ...future.mc.cores.old) [15:31:58.807] NULL [15:31:58.807] } [15:31:58.807] options(future.plan = NULL) [15:31:58.807] if (is.na(NA_character_)) [15:31:58.807] Sys.unsetenv("R_FUTURE_PLAN") [15:31:58.807] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:58.807] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:58.807] .init = FALSE) [15:31:58.807] } [15:31:58.807] } [15:31:58.807] } [15:31:58.807] }) [15:31:58.807] if (TRUE) { [15:31:58.807] base::sink(type = "output", split = FALSE) [15:31:58.807] if (TRUE) { [15:31:58.807] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:58.807] } [15:31:58.807] else { [15:31:58.807] ...future.result["stdout"] <- base::list(NULL) [15:31:58.807] } [15:31:58.807] base::close(...future.stdout) [15:31:58.807] ...future.stdout <- NULL [15:31:58.807] } [15:31:58.807] ...future.result$conditions <- ...future.conditions [15:31:58.807] ...future.result$finished <- base::Sys.time() [15:31:58.807] ...future.result [15:31:58.807] } [15:31:58.817] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:58.818] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:58.818] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:58.819] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:58.819] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:58.820] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... [15:31:58.820] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... DONE [15:31:58.820] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:58.821] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:58.821] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:58.821] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:58.822] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:58.822] MultisessionFuture started [15:31:58.823] - Launch lazy future ... done [15:31:58.823] run() for 'MultisessionFuture' ... done [15:31:58.823] Created future: [15:31:58.843] receiveMessageFromWorker() for ClusterFuture ... [15:31:58.844] - Validating connection of MultisessionFuture [15:31:58.844] - received message: FutureResult [15:31:58.845] - Received FutureResult [15:31:58.845] - Erased future from FutureRegistry [15:31:58.845] result() for ClusterFuture ... [15:31:58.846] - result already collected: FutureResult [15:31:58.846] result() for ClusterFuture ... done [15:31:58.846] receiveMessageFromWorker() for ClusterFuture ... done [15:31:58.823] MultisessionFuture: [15:31:58.823] Label: 'future_lapply-2' [15:31:58.823] Expression: [15:31:58.823] { [15:31:58.823] do.call(function(...) { [15:31:58.823] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:58.823] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:58.823] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:58.823] on.exit(options(oopts), add = TRUE) [15:31:58.823] } [15:31:58.823] { [15:31:58.823] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:58.823] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:58.823] ...future.FUN(...future.X_jj, ...) [15:31:58.823] }) [15:31:58.823] } [15:31:58.823] }, args = future.call.arguments) [15:31:58.823] } [15:31:58.823] Lazy evaluation: FALSE [15:31:58.823] Asynchronous evaluation: TRUE [15:31:58.823] Local evaluation: TRUE [15:31:58.823] Environment: R_GlobalEnv [15:31:58.823] Capture standard output: TRUE [15:31:58.823] Capture condition classes: 'condition' (excluding 'nothing') [15:31:58.823] Globals: 5 objects totaling 2.41 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 224 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:58.823] Packages: [15:31:58.823] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:58.823] Resolved: TRUE [15:31:58.823] Value: [15:31:58.823] Conditions captured: [15:31:58.823] Early signaling: FALSE [15:31:58.823] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:58.823] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:58.847] Chunk #2 of 2 ... DONE [15:31:58.847] Launching 2 futures (chunks) ... DONE [15:31:58.848] Resolving 2 futures (chunks) ... [15:31:58.848] resolve() on list ... [15:31:58.848] recursive: 0 [15:31:58.848] length: 2 [15:31:58.849] [15:31:58.849] Future #1 [15:31:58.849] result() for ClusterFuture ... [15:31:58.850] - result already collected: FutureResult [15:31:58.850] result() for ClusterFuture ... done [15:31:58.850] result() for ClusterFuture ... [15:31:58.851] - result already collected: FutureResult [15:31:58.851] result() for ClusterFuture ... done [15:31:58.851] signalConditionsASAP(MultisessionFuture, pos=1) ... [15:31:58.852] - nx: 2 [15:31:58.852] - relay: TRUE [15:31:58.852] - stdout: TRUE [15:31:58.853] - signal: TRUE [15:31:58.853] - resignal: FALSE [15:31:58.853] - force: TRUE [15:31:58.853] - relayed: [n=2] FALSE, FALSE [15:31:58.854] - queued futures: [n=2] FALSE, FALSE [15:31:58.854] - until=1 [15:31:58.854] - relaying element #1 [15:31:58.854] result() for ClusterFuture ... [15:31:58.854] - result already collected: FutureResult [15:31:58.854] result() for ClusterFuture ... done [15:31:58.855] result() for ClusterFuture ... [15:31:58.855] - result already collected: FutureResult [15:31:58.855] result() for ClusterFuture ... done [15:31:58.855] result() for ClusterFuture ... [15:31:58.855] - result already collected: FutureResult [15:31:58.856] result() for ClusterFuture ... done [15:31:58.856] result() for ClusterFuture ... [15:31:58.856] - result already collected: FutureResult [15:31:58.856] result() for ClusterFuture ... done [15:31:58.856] - relayed: [n=2] TRUE, FALSE [15:31:58.856] - queued futures: [n=2] TRUE, FALSE [15:31:58.857] signalConditionsASAP(MultisessionFuture, pos=1) ... done [15:31:58.857] length: 1 (resolved future 1) [15:31:58.857] Future #2 [15:31:58.857] result() for ClusterFuture ... [15:31:58.857] - result already collected: FutureResult [15:31:58.858] result() for ClusterFuture ... done [15:31:58.858] result() for ClusterFuture ... [15:31:58.858] - result already collected: FutureResult [15:31:58.858] result() for ClusterFuture ... done [15:31:58.858] signalConditionsASAP(MultisessionFuture, pos=2) ... [15:31:58.858] - nx: 2 [15:31:58.859] - relay: TRUE [15:31:58.859] - stdout: TRUE [15:31:58.859] - signal: TRUE [15:31:58.859] - resignal: FALSE [15:31:58.859] - force: TRUE [15:31:58.859] - relayed: [n=2] TRUE, FALSE [15:31:58.860] - queued futures: [n=2] TRUE, FALSE [15:31:58.860] - until=2 [15:31:58.860] - relaying element #2 [15:31:58.860] result() for ClusterFuture ... [15:31:58.860] - result already collected: FutureResult [15:31:58.860] result() for ClusterFuture ... done [15:31:58.861] result() for ClusterFuture ... [15:31:58.861] - result already collected: FutureResult [15:31:58.861] result() for ClusterFuture ... done [15:31:58.861] result() for ClusterFuture ... [15:31:58.861] - result already collected: FutureResult [15:31:58.861] result() for ClusterFuture ... done [15:31:58.862] result() for ClusterFuture ... [15:31:58.862] - result already collected: FutureResult [15:31:58.862] result() for ClusterFuture ... done [15:31:58.862] - relayed: [n=2] TRUE, TRUE [15:31:58.862] - queued futures: [n=2] TRUE, TRUE [15:31:58.862] signalConditionsASAP(MultisessionFuture, pos=2) ... done [15:31:58.863] length: 0 (resolved future 2) [15:31:58.863] Relaying remaining futures [15:31:58.863] signalConditionsASAP(NULL, pos=0) ... [15:31:58.863] - nx: 2 [15:31:58.863] - relay: TRUE [15:31:58.863] - stdout: TRUE [15:31:58.864] - signal: TRUE [15:31:58.864] - resignal: FALSE [15:31:58.864] - force: TRUE [15:31:58.864] - relayed: [n=2] TRUE, TRUE [15:31:58.864] - queued futures: [n=2] TRUE, TRUE - flush all [15:31:58.865] - relayed: [n=2] TRUE, TRUE [15:31:58.865] - queued futures: [n=2] TRUE, TRUE [15:31:58.865] signalConditionsASAP(NULL, pos=0) ... done [15:31:58.865] resolve() on list ... DONE [15:31:58.865] result() for ClusterFuture ... [15:31:58.865] - result already collected: FutureResult [15:31:58.865] result() for ClusterFuture ... done [15:31:58.866] result() for ClusterFuture ... [15:31:58.866] - result already collected: FutureResult [15:31:58.866] result() for ClusterFuture ... done [15:31:58.866] result() for ClusterFuture ... [15:31:58.866] - result already collected: FutureResult [15:31:58.866] result() for ClusterFuture ... done [15:31:58.867] result() for ClusterFuture ... [15:31:58.867] - result already collected: FutureResult [15:31:58.867] result() for ClusterFuture ... done [15:31:58.867] - Number of value chunks collected: 2 [15:31:58.867] Resolving 2 futures (chunks) ... DONE [15:31:58.868] Reducing values from 2 chunks ... [15:31:58.868] - Number of values collected after concatenation: 4 [15:31:58.868] - Number of values expected: 4 [15:31:58.868] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 1, 2, 3 [15:31:58.868] Reducing values from 2 chunks ... DONE [15:31:58.868] 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, ...) ... [15:31:58.871] future_lapply() ... [15:31:58.875] Number of chunks: 2 [15:31:58.875] Index remapping (attribute 'ordering'): [n = 4] 2, 3, 4, 1 [15:31:58.875] getGlobalsAndPackagesXApply() ... [15:31:58.876] - future.globals: TRUE [15:31:58.876] getGlobalsAndPackages() ... [15:31:58.876] Searching for globals... [15:31:58.878] - globals found: [2] 'FUN', '.Internal' [15:31:58.878] Searching for globals ... DONE [15:31:58.878] Resolving globals: FALSE [15:31:58.879] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:58.879] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:58.879] - globals: [1] 'FUN' [15:31:58.879] [15:31:58.880] getGlobalsAndPackages() ... DONE [15:31:58.880] - globals found/used: [n=1] 'FUN' [15:31:58.880] - needed namespaces: [n=0] [15:31:58.880] Finding globals ... DONE [15:31:58.880] - use_args: TRUE [15:31:58.881] - Getting '...' globals ... [15:31:58.881] resolve() on list ... [15:31:58.881] recursive: 0 [15:31:58.881] length: 1 [15:31:58.882] elements: '...' [15:31:58.882] length: 0 (resolved future 1) [15:31:58.882] resolve() on list ... DONE [15:31:58.882] - '...' content: [n=1] 'length' [15:31:58.882] List of 1 [15:31:58.882] $ ...:List of 1 [15:31:58.882] ..$ length: int 2 [15:31:58.882] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:58.882] - attr(*, "where")=List of 1 [15:31:58.882] ..$ ...: [15:31:58.882] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:58.882] - attr(*, "resolved")= logi TRUE [15:31:58.882] - attr(*, "total_size")= num NA [15:31:58.886] - Getting '...' globals ... DONE [15:31:58.886] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:58.887] List of 2 [15:31:58.887] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:58.887] $ ... :List of 1 [15:31:58.887] ..$ length: int 2 [15:31:58.887] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:58.887] - attr(*, "where")=List of 2 [15:31:58.887] ..$ ...future.FUN: [15:31:58.887] ..$ ... : [15:31:58.887] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:58.887] - attr(*, "resolved")= logi FALSE [15:31:58.887] - attr(*, "total_size")= num 2240 [15:31:58.893] Packages to be attached in all futures: [n=0] [15:31:58.894] getGlobalsAndPackagesXApply() ... DONE [15:31:58.894] Number of futures (= number of chunks): 2 [15:31:58.894] Launching 2 futures (chunks) ... [15:31:58.894] Chunk #1 of 2 ... [15:31:58.894] - Finding globals in 'X' for chunk #1 ... [15:31:58.895] getGlobalsAndPackages() ... [15:31:58.895] Searching for globals... [15:31:58.895] [15:31:58.895] Searching for globals ... DONE [15:31:58.896] - globals: [0] [15:31:58.896] getGlobalsAndPackages() ... DONE [15:31:58.896] + additional globals found: [n=0] [15:31:58.896] + additional namespaces needed: [n=0] [15:31:58.896] - Finding globals in 'X' for chunk #1 ... DONE [15:31:58.896] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:58.897] - seeds: [15:31:58.897] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.897] getGlobalsAndPackages() ... [15:31:58.897] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.897] Resolving globals: FALSE [15:31:58.897] Tweak future expression to call with '...' arguments ... [15:31:58.898] { [15:31:58.898] do.call(function(...) { [15:31:58.898] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:58.898] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:58.898] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:58.898] on.exit(options(oopts), add = TRUE) [15:31:58.898] } [15:31:58.898] { [15:31:58.898] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:58.898] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:58.898] ...future.FUN(...future.X_jj, ...) [15:31:58.898] }) [15:31:58.898] } [15:31:58.898] }, args = future.call.arguments) [15:31:58.898] } [15:31:58.898] Tweak future expression to call with '...' arguments ... DONE [15:31:58.899] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.899] [15:31:58.899] getGlobalsAndPackages() ... DONE [15:31:58.899] run() for 'Future' ... [15:31:58.900] - state: 'created' [15:31:58.900] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:58.915] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:58.916] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:58.916] - Field: 'node' [15:31:58.916] - Field: 'label' [15:31:58.916] - Field: 'local' [15:31:58.916] - Field: 'owner' [15:31:58.917] - Field: 'envir' [15:31:58.917] - Field: 'workers' [15:31:58.917] - Field: 'packages' [15:31:58.917] - Field: 'gc' [15:31:58.917] - Field: 'conditions' [15:31:58.917] - Field: 'persistent' [15:31:58.918] - Field: 'expr' [15:31:58.918] - Field: 'uuid' [15:31:58.918] - Field: 'seed' [15:31:58.918] - Field: 'version' [15:31:58.918] - Field: 'result' [15:31:58.919] - Field: 'asynchronous' [15:31:58.919] - Field: 'calls' [15:31:58.919] - Field: 'globals' [15:31:58.919] - Field: 'stdout' [15:31:58.919] - Field: 'earlySignal' [15:31:58.920] - Field: 'lazy' [15:31:58.920] - Field: 'state' [15:31:58.920] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:58.920] - Launch lazy future ... [15:31:58.921] Packages needed by the future expression (n = 0): [15:31:58.921] Packages needed by future strategies (n = 0): [15:31:58.922] { [15:31:58.922] { [15:31:58.922] { [15:31:58.922] ...future.startTime <- base::Sys.time() [15:31:58.922] { [15:31:58.922] { [15:31:58.922] { [15:31:58.922] { [15:31:58.922] base::local({ [15:31:58.922] has_future <- base::requireNamespace("future", [15:31:58.922] quietly = TRUE) [15:31:58.922] if (has_future) { [15:31:58.922] ns <- base::getNamespace("future") [15:31:58.922] version <- ns[[".package"]][["version"]] [15:31:58.922] if (is.null(version)) [15:31:58.922] version <- utils::packageVersion("future") [15:31:58.922] } [15:31:58.922] else { [15:31:58.922] version <- NULL [15:31:58.922] } [15:31:58.922] if (!has_future || version < "1.8.0") { [15:31:58.922] info <- base::c(r_version = base::gsub("R version ", [15:31:58.922] "", base::R.version$version.string), [15:31:58.922] platform = base::sprintf("%s (%s-bit)", [15:31:58.922] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:58.922] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:58.922] "release", "version")], collapse = " "), [15:31:58.922] hostname = base::Sys.info()[["nodename"]]) [15:31:58.922] info <- base::sprintf("%s: %s", base::names(info), [15:31:58.922] info) [15:31:58.922] info <- base::paste(info, collapse = "; ") [15:31:58.922] if (!has_future) { [15:31:58.922] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:58.922] info) [15:31:58.922] } [15:31:58.922] else { [15:31:58.922] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:58.922] info, version) [15:31:58.922] } [15:31:58.922] base::stop(msg) [15:31:58.922] } [15:31:58.922] }) [15:31:58.922] } [15:31:58.922] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:58.922] base::options(mc.cores = 1L) [15:31:58.922] } [15:31:58.922] ...future.strategy.old <- future::plan("list") [15:31:58.922] options(future.plan = NULL) [15:31:58.922] Sys.unsetenv("R_FUTURE_PLAN") [15:31:58.922] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:58.922] } [15:31:58.922] ...future.workdir <- getwd() [15:31:58.922] } [15:31:58.922] ...future.oldOptions <- base::as.list(base::.Options) [15:31:58.922] ...future.oldEnvVars <- base::Sys.getenv() [15:31:58.922] } [15:31:58.922] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:58.922] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:58.922] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:58.922] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:58.922] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:58.922] future.stdout.windows.reencode = NULL, width = 80L) [15:31:58.922] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:58.922] base::names(...future.oldOptions)) [15:31:58.922] } [15:31:58.922] if (FALSE) { [15:31:58.922] } [15:31:58.922] else { [15:31:58.922] if (TRUE) { [15:31:58.922] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:58.922] open = "w") [15:31:58.922] } [15:31:58.922] else { [15:31:58.922] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:58.922] windows = "NUL", "/dev/null"), open = "w") [15:31:58.922] } [15:31:58.922] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:58.922] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:58.922] base::sink(type = "output", split = FALSE) [15:31:58.922] base::close(...future.stdout) [15:31:58.922] }, add = TRUE) [15:31:58.922] } [15:31:58.922] ...future.frame <- base::sys.nframe() [15:31:58.922] ...future.conditions <- base::list() [15:31:58.922] ...future.rng <- base::globalenv()$.Random.seed [15:31:58.922] if (FALSE) { [15:31:58.922] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:58.922] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:58.922] } [15:31:58.922] ...future.result <- base::tryCatch({ [15:31:58.922] base::withCallingHandlers({ [15:31:58.922] ...future.value <- base::withVisible(base::local({ [15:31:58.922] ...future.makeSendCondition <- base::local({ [15:31:58.922] sendCondition <- NULL [15:31:58.922] function(frame = 1L) { [15:31:58.922] if (is.function(sendCondition)) [15:31:58.922] return(sendCondition) [15:31:58.922] ns <- getNamespace("parallel") [15:31:58.922] if (exists("sendData", mode = "function", [15:31:58.922] envir = ns)) { [15:31:58.922] parallel_sendData <- get("sendData", mode = "function", [15:31:58.922] envir = ns) [15:31:58.922] envir <- sys.frame(frame) [15:31:58.922] master <- NULL [15:31:58.922] while (!identical(envir, .GlobalEnv) && [15:31:58.922] !identical(envir, emptyenv())) { [15:31:58.922] if (exists("master", mode = "list", envir = envir, [15:31:58.922] inherits = FALSE)) { [15:31:58.922] master <- get("master", mode = "list", [15:31:58.922] envir = envir, inherits = FALSE) [15:31:58.922] if (inherits(master, c("SOCKnode", [15:31:58.922] "SOCK0node"))) { [15:31:58.922] sendCondition <<- function(cond) { [15:31:58.922] data <- list(type = "VALUE", value = cond, [15:31:58.922] success = TRUE) [15:31:58.922] parallel_sendData(master, data) [15:31:58.922] } [15:31:58.922] return(sendCondition) [15:31:58.922] } [15:31:58.922] } [15:31:58.922] frame <- frame + 1L [15:31:58.922] envir <- sys.frame(frame) [15:31:58.922] } [15:31:58.922] } [15:31:58.922] sendCondition <<- function(cond) NULL [15:31:58.922] } [15:31:58.922] }) [15:31:58.922] withCallingHandlers({ [15:31:58.922] { [15:31:58.922] do.call(function(...) { [15:31:58.922] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:58.922] if (!identical(...future.globals.maxSize.org, [15:31:58.922] ...future.globals.maxSize)) { [15:31:58.922] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:58.922] on.exit(options(oopts), add = TRUE) [15:31:58.922] } [15:31:58.922] { [15:31:58.922] lapply(seq_along(...future.elements_ii), [15:31:58.922] FUN = function(jj) { [15:31:58.922] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:58.922] ...future.FUN(...future.X_jj, ...) [15:31:58.922] }) [15:31:58.922] } [15:31:58.922] }, args = future.call.arguments) [15:31:58.922] } [15:31:58.922] }, immediateCondition = function(cond) { [15:31:58.922] sendCondition <- ...future.makeSendCondition() [15:31:58.922] sendCondition(cond) [15:31:58.922] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.922] { [15:31:58.922] inherits <- base::inherits [15:31:58.922] invokeRestart <- base::invokeRestart [15:31:58.922] is.null <- base::is.null [15:31:58.922] muffled <- FALSE [15:31:58.922] if (inherits(cond, "message")) { [15:31:58.922] muffled <- grepl(pattern, "muffleMessage") [15:31:58.922] if (muffled) [15:31:58.922] invokeRestart("muffleMessage") [15:31:58.922] } [15:31:58.922] else if (inherits(cond, "warning")) { [15:31:58.922] muffled <- grepl(pattern, "muffleWarning") [15:31:58.922] if (muffled) [15:31:58.922] invokeRestart("muffleWarning") [15:31:58.922] } [15:31:58.922] else if (inherits(cond, "condition")) { [15:31:58.922] if (!is.null(pattern)) { [15:31:58.922] computeRestarts <- base::computeRestarts [15:31:58.922] grepl <- base::grepl [15:31:58.922] restarts <- computeRestarts(cond) [15:31:58.922] for (restart in restarts) { [15:31:58.922] name <- restart$name [15:31:58.922] if (is.null(name)) [15:31:58.922] next [15:31:58.922] if (!grepl(pattern, name)) [15:31:58.922] next [15:31:58.922] invokeRestart(restart) [15:31:58.922] muffled <- TRUE [15:31:58.922] break [15:31:58.922] } [15:31:58.922] } [15:31:58.922] } [15:31:58.922] invisible(muffled) [15:31:58.922] } [15:31:58.922] muffleCondition(cond) [15:31:58.922] }) [15:31:58.922] })) [15:31:58.922] future::FutureResult(value = ...future.value$value, [15:31:58.922] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:58.922] ...future.rng), globalenv = if (FALSE) [15:31:58.922] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:58.922] ...future.globalenv.names)) [15:31:58.922] else NULL, started = ...future.startTime, version = "1.8") [15:31:58.922] }, condition = base::local({ [15:31:58.922] c <- base::c [15:31:58.922] inherits <- base::inherits [15:31:58.922] invokeRestart <- base::invokeRestart [15:31:58.922] length <- base::length [15:31:58.922] list <- base::list [15:31:58.922] seq.int <- base::seq.int [15:31:58.922] signalCondition <- base::signalCondition [15:31:58.922] sys.calls <- base::sys.calls [15:31:58.922] `[[` <- base::`[[` [15:31:58.922] `+` <- base::`+` [15:31:58.922] `<<-` <- base::`<<-` [15:31:58.922] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:58.922] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:58.922] 3L)] [15:31:58.922] } [15:31:58.922] function(cond) { [15:31:58.922] is_error <- inherits(cond, "error") [15:31:58.922] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:58.922] NULL) [15:31:58.922] if (is_error) { [15:31:58.922] sessionInformation <- function() { [15:31:58.922] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:58.922] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:58.922] search = base::search(), system = base::Sys.info()) [15:31:58.922] } [15:31:58.922] ...future.conditions[[length(...future.conditions) + [15:31:58.922] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:58.922] cond$call), session = sessionInformation(), [15:31:58.922] timestamp = base::Sys.time(), signaled = 0L) [15:31:58.922] signalCondition(cond) [15:31:58.922] } [15:31:58.922] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:58.922] "immediateCondition"))) { [15:31:58.922] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:58.922] ...future.conditions[[length(...future.conditions) + [15:31:58.922] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:58.922] if (TRUE && !signal) { [15:31:58.922] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.922] { [15:31:58.922] inherits <- base::inherits [15:31:58.922] invokeRestart <- base::invokeRestart [15:31:58.922] is.null <- base::is.null [15:31:58.922] muffled <- FALSE [15:31:58.922] if (inherits(cond, "message")) { [15:31:58.922] muffled <- grepl(pattern, "muffleMessage") [15:31:58.922] if (muffled) [15:31:58.922] invokeRestart("muffleMessage") [15:31:58.922] } [15:31:58.922] else if (inherits(cond, "warning")) { [15:31:58.922] muffled <- grepl(pattern, "muffleWarning") [15:31:58.922] if (muffled) [15:31:58.922] invokeRestart("muffleWarning") [15:31:58.922] } [15:31:58.922] else if (inherits(cond, "condition")) { [15:31:58.922] if (!is.null(pattern)) { [15:31:58.922] computeRestarts <- base::computeRestarts [15:31:58.922] grepl <- base::grepl [15:31:58.922] restarts <- computeRestarts(cond) [15:31:58.922] for (restart in restarts) { [15:31:58.922] name <- restart$name [15:31:58.922] if (is.null(name)) [15:31:58.922] next [15:31:58.922] if (!grepl(pattern, name)) [15:31:58.922] next [15:31:58.922] invokeRestart(restart) [15:31:58.922] muffled <- TRUE [15:31:58.922] break [15:31:58.922] } [15:31:58.922] } [15:31:58.922] } [15:31:58.922] invisible(muffled) [15:31:58.922] } [15:31:58.922] muffleCondition(cond, pattern = "^muffle") [15:31:58.922] } [15:31:58.922] } [15:31:58.922] else { [15:31:58.922] if (TRUE) { [15:31:58.922] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.922] { [15:31:58.922] inherits <- base::inherits [15:31:58.922] invokeRestart <- base::invokeRestart [15:31:58.922] is.null <- base::is.null [15:31:58.922] muffled <- FALSE [15:31:58.922] if (inherits(cond, "message")) { [15:31:58.922] muffled <- grepl(pattern, "muffleMessage") [15:31:58.922] if (muffled) [15:31:58.922] invokeRestart("muffleMessage") [15:31:58.922] } [15:31:58.922] else if (inherits(cond, "warning")) { [15:31:58.922] muffled <- grepl(pattern, "muffleWarning") [15:31:58.922] if (muffled) [15:31:58.922] invokeRestart("muffleWarning") [15:31:58.922] } [15:31:58.922] else if (inherits(cond, "condition")) { [15:31:58.922] if (!is.null(pattern)) { [15:31:58.922] computeRestarts <- base::computeRestarts [15:31:58.922] grepl <- base::grepl [15:31:58.922] restarts <- computeRestarts(cond) [15:31:58.922] for (restart in restarts) { [15:31:58.922] name <- restart$name [15:31:58.922] if (is.null(name)) [15:31:58.922] next [15:31:58.922] if (!grepl(pattern, name)) [15:31:58.922] next [15:31:58.922] invokeRestart(restart) [15:31:58.922] muffled <- TRUE [15:31:58.922] break [15:31:58.922] } [15:31:58.922] } [15:31:58.922] } [15:31:58.922] invisible(muffled) [15:31:58.922] } [15:31:58.922] muffleCondition(cond, pattern = "^muffle") [15:31:58.922] } [15:31:58.922] } [15:31:58.922] } [15:31:58.922] })) [15:31:58.922] }, error = function(ex) { [15:31:58.922] base::structure(base::list(value = NULL, visible = NULL, [15:31:58.922] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:58.922] ...future.rng), started = ...future.startTime, [15:31:58.922] finished = Sys.time(), session_uuid = NA_character_, [15:31:58.922] version = "1.8"), class = "FutureResult") [15:31:58.922] }, finally = { [15:31:58.922] if (!identical(...future.workdir, getwd())) [15:31:58.922] setwd(...future.workdir) [15:31:58.922] { [15:31:58.922] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:58.922] ...future.oldOptions$nwarnings <- NULL [15:31:58.922] } [15:31:58.922] base::options(...future.oldOptions) [15:31:58.922] if (.Platform$OS.type == "windows") { [15:31:58.922] old_names <- names(...future.oldEnvVars) [15:31:58.922] envs <- base::Sys.getenv() [15:31:58.922] names <- names(envs) [15:31:58.922] common <- intersect(names, old_names) [15:31:58.922] added <- setdiff(names, old_names) [15:31:58.922] removed <- setdiff(old_names, names) [15:31:58.922] changed <- common[...future.oldEnvVars[common] != [15:31:58.922] envs[common]] [15:31:58.922] NAMES <- toupper(changed) [15:31:58.922] args <- list() [15:31:58.922] for (kk in seq_along(NAMES)) { [15:31:58.922] name <- changed[[kk]] [15:31:58.922] NAME <- NAMES[[kk]] [15:31:58.922] if (name != NAME && is.element(NAME, old_names)) [15:31:58.922] next [15:31:58.922] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:58.922] } [15:31:58.922] NAMES <- toupper(added) [15:31:58.922] for (kk in seq_along(NAMES)) { [15:31:58.922] name <- added[[kk]] [15:31:58.922] NAME <- NAMES[[kk]] [15:31:58.922] if (name != NAME && is.element(NAME, old_names)) [15:31:58.922] next [15:31:58.922] args[[name]] <- "" [15:31:58.922] } [15:31:58.922] NAMES <- toupper(removed) [15:31:58.922] for (kk in seq_along(NAMES)) { [15:31:58.922] name <- removed[[kk]] [15:31:58.922] NAME <- NAMES[[kk]] [15:31:58.922] if (name != NAME && is.element(NAME, old_names)) [15:31:58.922] next [15:31:58.922] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:58.922] } [15:31:58.922] if (length(args) > 0) [15:31:58.922] base::do.call(base::Sys.setenv, args = args) [15:31:58.922] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:58.922] } [15:31:58.922] else { [15:31:58.922] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:58.922] } [15:31:58.922] { [15:31:58.922] if (base::length(...future.futureOptionsAdded) > [15:31:58.922] 0L) { [15:31:58.922] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:58.922] base::names(opts) <- ...future.futureOptionsAdded [15:31:58.922] base::options(opts) [15:31:58.922] } [15:31:58.922] { [15:31:58.922] { [15:31:58.922] base::options(mc.cores = ...future.mc.cores.old) [15:31:58.922] NULL [15:31:58.922] } [15:31:58.922] options(future.plan = NULL) [15:31:58.922] if (is.na(NA_character_)) [15:31:58.922] Sys.unsetenv("R_FUTURE_PLAN") [15:31:58.922] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:58.922] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:58.922] .init = FALSE) [15:31:58.922] } [15:31:58.922] } [15:31:58.922] } [15:31:58.922] }) [15:31:58.922] if (TRUE) { [15:31:58.922] base::sink(type = "output", split = FALSE) [15:31:58.922] if (TRUE) { [15:31:58.922] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:58.922] } [15:31:58.922] else { [15:31:58.922] ...future.result["stdout"] <- base::list(NULL) [15:31:58.922] } [15:31:58.922] base::close(...future.stdout) [15:31:58.922] ...future.stdout <- NULL [15:31:58.922] } [15:31:58.922] ...future.result$conditions <- ...future.conditions [15:31:58.922] ...future.result$finished <- base::Sys.time() [15:31:58.922] ...future.result [15:31:58.922] } [15:31:58.928] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:58.928] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:58.928] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:58.929] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:58.929] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:58.930] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... [15:31:58.930] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... DONE [15:31:58.930] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:58.931] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:58.931] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:58.931] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:58.931] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:58.932] MultisessionFuture started [15:31:58.932] - Launch lazy future ... done [15:31:58.932] run() for 'MultisessionFuture' ... done [15:31:58.933] Created future: [15:31:58.951] receiveMessageFromWorker() for ClusterFuture ... [15:31:58.952] - Validating connection of MultisessionFuture [15:31:58.952] - received message: FutureResult [15:31:58.953] - Received FutureResult [15:31:58.953] - Erased future from FutureRegistry [15:31:58.953] result() for ClusterFuture ... [15:31:58.953] - result already collected: FutureResult [15:31:58.954] result() for ClusterFuture ... done [15:31:58.954] receiveMessageFromWorker() for ClusterFuture ... done [15:31:58.933] MultisessionFuture: [15:31:58.933] Label: 'future_lapply-1' [15:31:58.933] Expression: [15:31:58.933] { [15:31:58.933] do.call(function(...) { [15:31:58.933] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:58.933] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:58.933] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:58.933] on.exit(options(oopts), add = TRUE) [15:31:58.933] } [15:31:58.933] { [15:31:58.933] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:58.933] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:58.933] ...future.FUN(...future.X_jj, ...) [15:31:58.933] }) [15:31:58.933] } [15:31:58.933] }, args = future.call.arguments) [15:31:58.933] } [15:31:58.933] Lazy evaluation: FALSE [15:31:58.933] Asynchronous evaluation: TRUE [15:31:58.933] Local evaluation: TRUE [15:31:58.933] Environment: R_GlobalEnv [15:31:58.933] Capture standard output: TRUE [15:31:58.933] Capture condition classes: 'condition' (excluding 'nothing') [15:31:58.933] Globals: 5 objects totaling 2.41 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 232 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:58.933] Packages: [15:31:58.933] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:58.933] Resolved: TRUE [15:31:58.933] Value: [15:31:58.933] Conditions captured: [15:31:58.933] Early signaling: FALSE [15:31:58.933] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:58.933] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:58.955] Chunk #1 of 2 ... DONE [15:31:58.955] Chunk #2 of 2 ... [15:31:58.955] - Finding globals in 'X' for chunk #2 ... [15:31:58.956] getGlobalsAndPackages() ... [15:31:58.956] Searching for globals... [15:31:58.957] [15:31:58.957] Searching for globals ... DONE [15:31:58.957] - globals: [0] [15:31:58.957] getGlobalsAndPackages() ... DONE [15:31:58.958] + additional globals found: [n=0] [15:31:58.958] + additional namespaces needed: [n=0] [15:31:58.958] - Finding globals in 'X' for chunk #2 ... DONE [15:31:58.959] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:58.959] - seeds: [15:31:58.959] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.959] getGlobalsAndPackages() ... [15:31:58.960] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.960] Resolving globals: FALSE [15:31:58.960] Tweak future expression to call with '...' arguments ... [15:31:58.961] { [15:31:58.961] do.call(function(...) { [15:31:58.961] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:58.961] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:58.961] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:58.961] on.exit(options(oopts), add = TRUE) [15:31:58.961] } [15:31:58.961] { [15:31:58.961] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:58.961] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:58.961] ...future.FUN(...future.X_jj, ...) [15:31:58.961] }) [15:31:58.961] } [15:31:58.961] }, args = future.call.arguments) [15:31:58.961] } [15:31:58.962] Tweak future expression to call with '...' arguments ... DONE [15:31:58.962] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:58.963] [15:31:58.963] getGlobalsAndPackages() ... DONE [15:31:58.964] run() for 'Future' ... [15:31:58.964] - state: 'created' [15:31:58.965] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:58.983] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:58.984] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:58.984] - Field: 'node' [15:31:58.985] - Field: 'label' [15:31:58.985] - Field: 'local' [15:31:58.985] - Field: 'owner' [15:31:58.986] - Field: 'envir' [15:31:58.986] - Field: 'workers' [15:31:58.986] - Field: 'packages' [15:31:58.987] - Field: 'gc' [15:31:58.987] - Field: 'conditions' [15:31:58.988] - Field: 'persistent' [15:31:58.988] - Field: 'expr' [15:31:58.989] - Field: 'uuid' [15:31:58.989] - Field: 'seed' [15:31:58.989] - Field: 'version' [15:31:58.990] - Field: 'result' [15:31:58.990] - Field: 'asynchronous' [15:31:58.990] - Field: 'calls' [15:31:58.991] - Field: 'globals' [15:31:58.991] - Field: 'stdout' [15:31:58.991] - Field: 'earlySignal' [15:31:58.992] - Field: 'lazy' [15:31:58.992] - Field: 'state' [15:31:58.992] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:58.993] - Launch lazy future ... [15:31:58.994] Packages needed by the future expression (n = 0): [15:31:58.994] Packages needed by future strategies (n = 0): [15:31:58.995] { [15:31:58.995] { [15:31:58.995] { [15:31:58.995] ...future.startTime <- base::Sys.time() [15:31:58.995] { [15:31:58.995] { [15:31:58.995] { [15:31:58.995] { [15:31:58.995] base::local({ [15:31:58.995] has_future <- base::requireNamespace("future", [15:31:58.995] quietly = TRUE) [15:31:58.995] if (has_future) { [15:31:58.995] ns <- base::getNamespace("future") [15:31:58.995] version <- ns[[".package"]][["version"]] [15:31:58.995] if (is.null(version)) [15:31:58.995] version <- utils::packageVersion("future") [15:31:58.995] } [15:31:58.995] else { [15:31:58.995] version <- NULL [15:31:58.995] } [15:31:58.995] if (!has_future || version < "1.8.0") { [15:31:58.995] info <- base::c(r_version = base::gsub("R version ", [15:31:58.995] "", base::R.version$version.string), [15:31:58.995] platform = base::sprintf("%s (%s-bit)", [15:31:58.995] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:58.995] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:58.995] "release", "version")], collapse = " "), [15:31:58.995] hostname = base::Sys.info()[["nodename"]]) [15:31:58.995] info <- base::sprintf("%s: %s", base::names(info), [15:31:58.995] info) [15:31:58.995] info <- base::paste(info, collapse = "; ") [15:31:58.995] if (!has_future) { [15:31:58.995] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:58.995] info) [15:31:58.995] } [15:31:58.995] else { [15:31:58.995] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:58.995] info, version) [15:31:58.995] } [15:31:58.995] base::stop(msg) [15:31:58.995] } [15:31:58.995] }) [15:31:58.995] } [15:31:58.995] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:58.995] base::options(mc.cores = 1L) [15:31:58.995] } [15:31:58.995] ...future.strategy.old <- future::plan("list") [15:31:58.995] options(future.plan = NULL) [15:31:58.995] Sys.unsetenv("R_FUTURE_PLAN") [15:31:58.995] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:58.995] } [15:31:58.995] ...future.workdir <- getwd() [15:31:58.995] } [15:31:58.995] ...future.oldOptions <- base::as.list(base::.Options) [15:31:58.995] ...future.oldEnvVars <- base::Sys.getenv() [15:31:58.995] } [15:31:58.995] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:58.995] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:58.995] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:58.995] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:58.995] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:58.995] future.stdout.windows.reencode = NULL, width = 80L) [15:31:58.995] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:58.995] base::names(...future.oldOptions)) [15:31:58.995] } [15:31:58.995] if (FALSE) { [15:31:58.995] } [15:31:58.995] else { [15:31:58.995] if (TRUE) { [15:31:58.995] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:58.995] open = "w") [15:31:58.995] } [15:31:58.995] else { [15:31:58.995] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:58.995] windows = "NUL", "/dev/null"), open = "w") [15:31:58.995] } [15:31:58.995] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:58.995] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:58.995] base::sink(type = "output", split = FALSE) [15:31:58.995] base::close(...future.stdout) [15:31:58.995] }, add = TRUE) [15:31:58.995] } [15:31:58.995] ...future.frame <- base::sys.nframe() [15:31:58.995] ...future.conditions <- base::list() [15:31:58.995] ...future.rng <- base::globalenv()$.Random.seed [15:31:58.995] if (FALSE) { [15:31:58.995] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:58.995] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:58.995] } [15:31:58.995] ...future.result <- base::tryCatch({ [15:31:58.995] base::withCallingHandlers({ [15:31:58.995] ...future.value <- base::withVisible(base::local({ [15:31:58.995] ...future.makeSendCondition <- base::local({ [15:31:58.995] sendCondition <- NULL [15:31:58.995] function(frame = 1L) { [15:31:58.995] if (is.function(sendCondition)) [15:31:58.995] return(sendCondition) [15:31:58.995] ns <- getNamespace("parallel") [15:31:58.995] if (exists("sendData", mode = "function", [15:31:58.995] envir = ns)) { [15:31:58.995] parallel_sendData <- get("sendData", mode = "function", [15:31:58.995] envir = ns) [15:31:58.995] envir <- sys.frame(frame) [15:31:58.995] master <- NULL [15:31:58.995] while (!identical(envir, .GlobalEnv) && [15:31:58.995] !identical(envir, emptyenv())) { [15:31:58.995] if (exists("master", mode = "list", envir = envir, [15:31:58.995] inherits = FALSE)) { [15:31:58.995] master <- get("master", mode = "list", [15:31:58.995] envir = envir, inherits = FALSE) [15:31:58.995] if (inherits(master, c("SOCKnode", [15:31:58.995] "SOCK0node"))) { [15:31:58.995] sendCondition <<- function(cond) { [15:31:58.995] data <- list(type = "VALUE", value = cond, [15:31:58.995] success = TRUE) [15:31:58.995] parallel_sendData(master, data) [15:31:58.995] } [15:31:58.995] return(sendCondition) [15:31:58.995] } [15:31:58.995] } [15:31:58.995] frame <- frame + 1L [15:31:58.995] envir <- sys.frame(frame) [15:31:58.995] } [15:31:58.995] } [15:31:58.995] sendCondition <<- function(cond) NULL [15:31:58.995] } [15:31:58.995] }) [15:31:58.995] withCallingHandlers({ [15:31:58.995] { [15:31:58.995] do.call(function(...) { [15:31:58.995] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:58.995] if (!identical(...future.globals.maxSize.org, [15:31:58.995] ...future.globals.maxSize)) { [15:31:58.995] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:58.995] on.exit(options(oopts), add = TRUE) [15:31:58.995] } [15:31:58.995] { [15:31:58.995] lapply(seq_along(...future.elements_ii), [15:31:58.995] FUN = function(jj) { [15:31:58.995] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:58.995] ...future.FUN(...future.X_jj, ...) [15:31:58.995] }) [15:31:58.995] } [15:31:58.995] }, args = future.call.arguments) [15:31:58.995] } [15:31:58.995] }, immediateCondition = function(cond) { [15:31:58.995] sendCondition <- ...future.makeSendCondition() [15:31:58.995] sendCondition(cond) [15:31:58.995] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.995] { [15:31:58.995] inherits <- base::inherits [15:31:58.995] invokeRestart <- base::invokeRestart [15:31:58.995] is.null <- base::is.null [15:31:58.995] muffled <- FALSE [15:31:58.995] if (inherits(cond, "message")) { [15:31:58.995] muffled <- grepl(pattern, "muffleMessage") [15:31:58.995] if (muffled) [15:31:58.995] invokeRestart("muffleMessage") [15:31:58.995] } [15:31:58.995] else if (inherits(cond, "warning")) { [15:31:58.995] muffled <- grepl(pattern, "muffleWarning") [15:31:58.995] if (muffled) [15:31:58.995] invokeRestart("muffleWarning") [15:31:58.995] } [15:31:58.995] else if (inherits(cond, "condition")) { [15:31:58.995] if (!is.null(pattern)) { [15:31:58.995] computeRestarts <- base::computeRestarts [15:31:58.995] grepl <- base::grepl [15:31:58.995] restarts <- computeRestarts(cond) [15:31:58.995] for (restart in restarts) { [15:31:58.995] name <- restart$name [15:31:58.995] if (is.null(name)) [15:31:58.995] next [15:31:58.995] if (!grepl(pattern, name)) [15:31:58.995] next [15:31:58.995] invokeRestart(restart) [15:31:58.995] muffled <- TRUE [15:31:58.995] break [15:31:58.995] } [15:31:58.995] } [15:31:58.995] } [15:31:58.995] invisible(muffled) [15:31:58.995] } [15:31:58.995] muffleCondition(cond) [15:31:58.995] }) [15:31:58.995] })) [15:31:58.995] future::FutureResult(value = ...future.value$value, [15:31:58.995] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:58.995] ...future.rng), globalenv = if (FALSE) [15:31:58.995] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:58.995] ...future.globalenv.names)) [15:31:58.995] else NULL, started = ...future.startTime, version = "1.8") [15:31:58.995] }, condition = base::local({ [15:31:58.995] c <- base::c [15:31:58.995] inherits <- base::inherits [15:31:58.995] invokeRestart <- base::invokeRestart [15:31:58.995] length <- base::length [15:31:58.995] list <- base::list [15:31:58.995] seq.int <- base::seq.int [15:31:58.995] signalCondition <- base::signalCondition [15:31:58.995] sys.calls <- base::sys.calls [15:31:58.995] `[[` <- base::`[[` [15:31:58.995] `+` <- base::`+` [15:31:58.995] `<<-` <- base::`<<-` [15:31:58.995] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:58.995] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:58.995] 3L)] [15:31:58.995] } [15:31:58.995] function(cond) { [15:31:58.995] is_error <- inherits(cond, "error") [15:31:58.995] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:58.995] NULL) [15:31:58.995] if (is_error) { [15:31:58.995] sessionInformation <- function() { [15:31:58.995] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:58.995] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:58.995] search = base::search(), system = base::Sys.info()) [15:31:58.995] } [15:31:58.995] ...future.conditions[[length(...future.conditions) + [15:31:58.995] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:58.995] cond$call), session = sessionInformation(), [15:31:58.995] timestamp = base::Sys.time(), signaled = 0L) [15:31:58.995] signalCondition(cond) [15:31:58.995] } [15:31:58.995] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:58.995] "immediateCondition"))) { [15:31:58.995] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:58.995] ...future.conditions[[length(...future.conditions) + [15:31:58.995] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:58.995] if (TRUE && !signal) { [15:31:58.995] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.995] { [15:31:58.995] inherits <- base::inherits [15:31:58.995] invokeRestart <- base::invokeRestart [15:31:58.995] is.null <- base::is.null [15:31:58.995] muffled <- FALSE [15:31:58.995] if (inherits(cond, "message")) { [15:31:58.995] muffled <- grepl(pattern, "muffleMessage") [15:31:58.995] if (muffled) [15:31:58.995] invokeRestart("muffleMessage") [15:31:58.995] } [15:31:58.995] else if (inherits(cond, "warning")) { [15:31:58.995] muffled <- grepl(pattern, "muffleWarning") [15:31:58.995] if (muffled) [15:31:58.995] invokeRestart("muffleWarning") [15:31:58.995] } [15:31:58.995] else if (inherits(cond, "condition")) { [15:31:58.995] if (!is.null(pattern)) { [15:31:58.995] computeRestarts <- base::computeRestarts [15:31:58.995] grepl <- base::grepl [15:31:58.995] restarts <- computeRestarts(cond) [15:31:58.995] for (restart in restarts) { [15:31:58.995] name <- restart$name [15:31:58.995] if (is.null(name)) [15:31:58.995] next [15:31:58.995] if (!grepl(pattern, name)) [15:31:58.995] next [15:31:58.995] invokeRestart(restart) [15:31:58.995] muffled <- TRUE [15:31:58.995] break [15:31:58.995] } [15:31:58.995] } [15:31:58.995] } [15:31:58.995] invisible(muffled) [15:31:58.995] } [15:31:58.995] muffleCondition(cond, pattern = "^muffle") [15:31:58.995] } [15:31:58.995] } [15:31:58.995] else { [15:31:58.995] if (TRUE) { [15:31:58.995] muffleCondition <- function (cond, pattern = "^muffle") [15:31:58.995] { [15:31:58.995] inherits <- base::inherits [15:31:58.995] invokeRestart <- base::invokeRestart [15:31:58.995] is.null <- base::is.null [15:31:58.995] muffled <- FALSE [15:31:58.995] if (inherits(cond, "message")) { [15:31:58.995] muffled <- grepl(pattern, "muffleMessage") [15:31:58.995] if (muffled) [15:31:58.995] invokeRestart("muffleMessage") [15:31:58.995] } [15:31:58.995] else if (inherits(cond, "warning")) { [15:31:58.995] muffled <- grepl(pattern, "muffleWarning") [15:31:58.995] if (muffled) [15:31:58.995] invokeRestart("muffleWarning") [15:31:58.995] } [15:31:58.995] else if (inherits(cond, "condition")) { [15:31:58.995] if (!is.null(pattern)) { [15:31:58.995] computeRestarts <- base::computeRestarts [15:31:58.995] grepl <- base::grepl [15:31:58.995] restarts <- computeRestarts(cond) [15:31:58.995] for (restart in restarts) { [15:31:58.995] name <- restart$name [15:31:58.995] if (is.null(name)) [15:31:58.995] next [15:31:58.995] if (!grepl(pattern, name)) [15:31:58.995] next [15:31:58.995] invokeRestart(restart) [15:31:58.995] muffled <- TRUE [15:31:58.995] break [15:31:58.995] } [15:31:58.995] } [15:31:58.995] } [15:31:58.995] invisible(muffled) [15:31:58.995] } [15:31:58.995] muffleCondition(cond, pattern = "^muffle") [15:31:58.995] } [15:31:58.995] } [15:31:58.995] } [15:31:58.995] })) [15:31:58.995] }, error = function(ex) { [15:31:58.995] base::structure(base::list(value = NULL, visible = NULL, [15:31:58.995] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:58.995] ...future.rng), started = ...future.startTime, [15:31:58.995] finished = Sys.time(), session_uuid = NA_character_, [15:31:58.995] version = "1.8"), class = "FutureResult") [15:31:58.995] }, finally = { [15:31:58.995] if (!identical(...future.workdir, getwd())) [15:31:58.995] setwd(...future.workdir) [15:31:58.995] { [15:31:58.995] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:58.995] ...future.oldOptions$nwarnings <- NULL [15:31:58.995] } [15:31:58.995] base::options(...future.oldOptions) [15:31:58.995] if (.Platform$OS.type == "windows") { [15:31:58.995] old_names <- names(...future.oldEnvVars) [15:31:58.995] envs <- base::Sys.getenv() [15:31:58.995] names <- names(envs) [15:31:58.995] common <- intersect(names, old_names) [15:31:58.995] added <- setdiff(names, old_names) [15:31:58.995] removed <- setdiff(old_names, names) [15:31:58.995] changed <- common[...future.oldEnvVars[common] != [15:31:58.995] envs[common]] [15:31:58.995] NAMES <- toupper(changed) [15:31:58.995] args <- list() [15:31:58.995] for (kk in seq_along(NAMES)) { [15:31:58.995] name <- changed[[kk]] [15:31:58.995] NAME <- NAMES[[kk]] [15:31:58.995] if (name != NAME && is.element(NAME, old_names)) [15:31:58.995] next [15:31:58.995] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:58.995] } [15:31:58.995] NAMES <- toupper(added) [15:31:58.995] for (kk in seq_along(NAMES)) { [15:31:58.995] name <- added[[kk]] [15:31:58.995] NAME <- NAMES[[kk]] [15:31:58.995] if (name != NAME && is.element(NAME, old_names)) [15:31:58.995] next [15:31:58.995] args[[name]] <- "" [15:31:58.995] } [15:31:58.995] NAMES <- toupper(removed) [15:31:58.995] for (kk in seq_along(NAMES)) { [15:31:58.995] name <- removed[[kk]] [15:31:58.995] NAME <- NAMES[[kk]] [15:31:58.995] if (name != NAME && is.element(NAME, old_names)) [15:31:58.995] next [15:31:58.995] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:58.995] } [15:31:58.995] if (length(args) > 0) [15:31:58.995] base::do.call(base::Sys.setenv, args = args) [15:31:58.995] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:58.995] } [15:31:58.995] else { [15:31:58.995] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:58.995] } [15:31:58.995] { [15:31:58.995] if (base::length(...future.futureOptionsAdded) > [15:31:58.995] 0L) { [15:31:58.995] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:58.995] base::names(opts) <- ...future.futureOptionsAdded [15:31:58.995] base::options(opts) [15:31:58.995] } [15:31:58.995] { [15:31:58.995] { [15:31:58.995] base::options(mc.cores = ...future.mc.cores.old) [15:31:58.995] NULL [15:31:58.995] } [15:31:58.995] options(future.plan = NULL) [15:31:58.995] if (is.na(NA_character_)) [15:31:58.995] Sys.unsetenv("R_FUTURE_PLAN") [15:31:58.995] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:58.995] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:58.995] .init = FALSE) [15:31:58.995] } [15:31:58.995] } [15:31:58.995] } [15:31:58.995] }) [15:31:58.995] if (TRUE) { [15:31:58.995] base::sink(type = "output", split = FALSE) [15:31:58.995] if (TRUE) { [15:31:58.995] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:58.995] } [15:31:58.995] else { [15:31:58.995] ...future.result["stdout"] <- base::list(NULL) [15:31:58.995] } [15:31:58.995] base::close(...future.stdout) [15:31:58.995] ...future.stdout <- NULL [15:31:58.995] } [15:31:58.995] ...future.result$conditions <- ...future.conditions [15:31:58.995] ...future.result$finished <- base::Sys.time() [15:31:58.995] ...future.result [15:31:58.995] } [15:31:59.005] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:59.006] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:59.006] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:59.007] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:59.008] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:59.008] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... [15:31:59.009] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... DONE [15:31:59.009] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:59.010] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:59.010] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:59.011] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:59.011] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:59.012] MultisessionFuture started [15:31:59.012] - Launch lazy future ... done [15:31:59.013] run() for 'MultisessionFuture' ... done [15:31:59.013] Created future: [15:31:59.043] receiveMessageFromWorker() for ClusterFuture ... [15:31:59.043] - Validating connection of MultisessionFuture [15:31:59.043] - received message: FutureResult [15:31:59.044] - Received FutureResult [15:31:59.044] - Erased future from FutureRegistry [15:31:59.044] result() for ClusterFuture ... [15:31:59.045] - result already collected: FutureResult [15:31:59.045] result() for ClusterFuture ... done [15:31:59.045] receiveMessageFromWorker() for ClusterFuture ... done [15:31:59.013] MultisessionFuture: [15:31:59.013] Label: 'future_lapply-2' [15:31:59.013] Expression: [15:31:59.013] { [15:31:59.013] do.call(function(...) { [15:31:59.013] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:59.013] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:59.013] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:59.013] on.exit(options(oopts), add = TRUE) [15:31:59.013] } [15:31:59.013] { [15:31:59.013] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:59.013] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:59.013] ...future.FUN(...future.X_jj, ...) [15:31:59.013] }) [15:31:59.013] } [15:31:59.013] }, args = future.call.arguments) [15:31:59.013] } [15:31:59.013] Lazy evaluation: FALSE [15:31:59.013] Asynchronous evaluation: TRUE [15:31:59.013] Local evaluation: TRUE [15:31:59.013] Environment: R_GlobalEnv [15:31:59.013] Capture standard output: TRUE [15:31:59.013] Capture condition classes: 'condition' (excluding 'nothing') [15:31:59.013] Globals: 5 objects totaling 2.41 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 224 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:59.013] Packages: [15:31:59.013] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:59.013] Resolved: TRUE [15:31:59.013] Value: [15:31:59.013] Conditions captured: [15:31:59.013] Early signaling: FALSE [15:31:59.013] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:59.013] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:59.046] Chunk #2 of 2 ... DONE [15:31:59.046] Launching 2 futures (chunks) ... DONE [15:31:59.047] Resolving 2 futures (chunks) ... [15:31:59.047] resolve() on list ... [15:31:59.047] recursive: 0 [15:31:59.048] length: 2 [15:31:59.048] [15:31:59.048] Future #1 [15:31:59.048] result() for ClusterFuture ... [15:31:59.049] - result already collected: FutureResult [15:31:59.049] result() for ClusterFuture ... done [15:31:59.049] result() for ClusterFuture ... [15:31:59.050] - result already collected: FutureResult [15:31:59.050] result() for ClusterFuture ... done [15:31:59.050] signalConditionsASAP(MultisessionFuture, pos=1) ... [15:31:59.050] - nx: 2 [15:31:59.051] - relay: TRUE [15:31:59.051] - stdout: TRUE [15:31:59.051] - signal: TRUE [15:31:59.051] - resignal: FALSE [15:31:59.052] - force: TRUE [15:31:59.052] - relayed: [n=2] FALSE, FALSE [15:31:59.052] - queued futures: [n=2] FALSE, FALSE [15:31:59.053] - until=1 [15:31:59.053] - relaying element #1 [15:31:59.053] result() for ClusterFuture ... [15:31:59.053] - result already collected: FutureResult [15:31:59.054] result() for ClusterFuture ... done [15:31:59.054] result() for ClusterFuture ... [15:31:59.054] - result already collected: FutureResult [15:31:59.054] result() for ClusterFuture ... done [15:31:59.055] result() for ClusterFuture ... [15:31:59.055] - result already collected: FutureResult [15:31:59.055] result() for ClusterFuture ... done [15:31:59.056] result() for ClusterFuture ... [15:31:59.056] - result already collected: FutureResult [15:31:59.056] result() for ClusterFuture ... done [15:31:59.056] - relayed: [n=2] TRUE, FALSE [15:31:59.057] - queued futures: [n=2] TRUE, FALSE [15:31:59.057] signalConditionsASAP(MultisessionFuture, pos=1) ... done [15:31:59.057] length: 1 (resolved future 1) [15:31:59.058] Future #2 [15:31:59.058] result() for ClusterFuture ... [15:31:59.058] - result already collected: FutureResult [15:31:59.058] result() for ClusterFuture ... done [15:31:59.059] result() for ClusterFuture ... [15:31:59.059] - result already collected: FutureResult [15:31:59.059] result() for ClusterFuture ... done [15:31:59.060] signalConditionsASAP(MultisessionFuture, pos=2) ... [15:31:59.060] - nx: 2 [15:31:59.060] - relay: TRUE [15:31:59.060] - stdout: TRUE [15:31:59.061] - signal: TRUE [15:31:59.061] - resignal: FALSE [15:31:59.061] - force: TRUE [15:31:59.061] - relayed: [n=2] TRUE, FALSE [15:31:59.062] - queued futures: [n=2] TRUE, FALSE [15:31:59.062] - until=2 [15:31:59.062] - relaying element #2 [15:31:59.063] result() for ClusterFuture ... [15:31:59.063] - result already collected: FutureResult [15:31:59.063] result() for ClusterFuture ... done [15:31:59.063] result() for ClusterFuture ... [15:31:59.064] - result already collected: FutureResult [15:31:59.064] result() for ClusterFuture ... done [15:31:59.064] result() for ClusterFuture ... [15:31:59.065] - result already collected: FutureResult [15:31:59.065] result() for ClusterFuture ... done [15:31:59.065] result() for ClusterFuture ... [15:31:59.065] - result already collected: FutureResult [15:31:59.066] result() for ClusterFuture ... done [15:31:59.066] - relayed: [n=2] TRUE, TRUE [15:31:59.066] - queued futures: [n=2] TRUE, TRUE [15:31:59.066] signalConditionsASAP(MultisessionFuture, pos=2) ... done [15:31:59.067] length: 0 (resolved future 2) [15:31:59.067] Relaying remaining futures [15:31:59.067] signalConditionsASAP(NULL, pos=0) ... [15:31:59.068] - nx: 2 [15:31:59.068] - relay: TRUE [15:31:59.068] - stdout: TRUE [15:31:59.068] - signal: TRUE [15:31:59.069] - resignal: FALSE [15:31:59.069] - force: TRUE [15:31:59.069] - relayed: [n=2] TRUE, TRUE [15:31:59.069] - queued futures: [n=2] TRUE, TRUE - flush all [15:31:59.070] - relayed: [n=2] TRUE, TRUE [15:31:59.070] - queued futures: [n=2] TRUE, TRUE [15:31:59.070] signalConditionsASAP(NULL, pos=0) ... done [15:31:59.071] resolve() on list ... DONE [15:31:59.071] result() for ClusterFuture ... [15:31:59.071] - result already collected: FutureResult [15:31:59.071] result() for ClusterFuture ... done [15:31:59.072] result() for ClusterFuture ... [15:31:59.072] - result already collected: FutureResult [15:31:59.072] result() for ClusterFuture ... done [15:31:59.073] result() for ClusterFuture ... [15:31:59.073] - result already collected: FutureResult [15:31:59.073] result() for ClusterFuture ... done [15:31:59.073] result() for ClusterFuture ... [15:31:59.074] - result already collected: FutureResult [15:31:59.074] result() for ClusterFuture ... done [15:31:59.074] - Number of value chunks collected: 2 [15:31:59.075] Resolving 2 futures (chunks) ... DONE [15:31:59.075] Reducing values from 2 chunks ... [15:31:59.075] - Number of values collected after concatenation: 4 [15:31:59.075] - Number of values expected: 4 [15:31:59.076] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 1, 2, 3 [15:31:59.076] Reducing values from 2 chunks ... DONE [15:31:59.076] 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, ...) ... [15:31:59.081] future_lapply() ... [15:31:59.100] Number of chunks: 1 [15:31:59.100] getGlobalsAndPackagesXApply() ... [15:31:59.101] - future.globals: TRUE [15:31:59.101] getGlobalsAndPackages() ... [15:31:59.101] Searching for globals... [15:31:59.119] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [15:31:59.120] Searching for globals ... DONE [15:31:59.120] Resolving globals: FALSE [15:31:59.122] The total size of the 1 globals is 69.62 KiB (71288 bytes) [15:31:59.123] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 69.62 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (69.62 KiB of class 'function') [15:31:59.123] - globals: [1] 'FUN' [15:31:59.124] - packages: [1] 'future' [15:31:59.124] getGlobalsAndPackages() ... DONE [15:31:59.124] - globals found/used: [n=1] 'FUN' [15:31:59.125] - needed namespaces: [n=1] 'future' [15:31:59.125] Finding globals ... DONE [15:31:59.125] - use_args: TRUE [15:31:59.126] - Getting '...' globals ... [15:31:59.126] resolve() on list ... [15:31:59.127] recursive: 0 [15:31:59.127] length: 1 [15:31:59.127] elements: '...' [15:31:59.127] length: 0 (resolved future 1) [15:31:59.128] resolve() on list ... DONE [15:31:59.128] - '...' content: [n=2] 'collapse', 'maxHead' [15:31:59.128] List of 1 [15:31:59.128] $ ...:List of 2 [15:31:59.128] ..$ collapse: chr "; " [15:31:59.128] ..$ maxHead : int 3 [15:31:59.128] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:59.128] - attr(*, "where")=List of 1 [15:31:59.128] ..$ ...: [15:31:59.128] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:59.128] - attr(*, "resolved")= logi TRUE [15:31:59.128] - attr(*, "total_size")= num NA [15:31:59.135] - Getting '...' globals ... DONE [15:31:59.136] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:59.136] List of 2 [15:31:59.136] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:31:59.136] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:31:59.136] $ ... :List of 2 [15:31:59.136] ..$ collapse: chr "; " [15:31:59.136] ..$ maxHead : int 3 [15:31:59.136] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:59.136] - attr(*, "where")=List of 2 [15:31:59.136] ..$ ...future.FUN: [15:31:59.136] ..$ ... : [15:31:59.136] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:59.136] - attr(*, "resolved")= logi FALSE [15:31:59.136] - attr(*, "total_size")= num 71456 [15:31:59.147] Packages to be attached in all futures: [n=1] 'future' [15:31:59.148] getGlobalsAndPackagesXApply() ... DONE [15:31:59.148] Number of futures (= number of chunks): 1 [15:31:59.149] Launching 1 futures (chunks) ... [15:31:59.149] Chunk #1 of 1 ... [15:31:59.149] - Finding globals in 'X' for chunk #1 ... [15:31:59.150] getGlobalsAndPackages() ... [15:31:59.150] Searching for globals... [15:31:59.151] [15:31:59.151] Searching for globals ... DONE [15:31:59.151] - globals: [0] [15:31:59.151] getGlobalsAndPackages() ... DONE [15:31:59.152] + additional globals found: [n=0] [15:31:59.152] + additional namespaces needed: [n=0] [15:31:59.152] - Finding globals in 'X' for chunk #1 ... DONE [15:31:59.152] - seeds: [15:31:59.153] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:59.153] getGlobalsAndPackages() ... [15:31:59.153] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:59.154] Resolving globals: FALSE [15:31:59.154] Tweak future expression to call with '...' arguments ... [15:31:59.154] { [15:31:59.154] do.call(function(...) { [15:31:59.154] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:59.154] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:59.154] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:59.154] on.exit(options(oopts), add = TRUE) [15:31:59.154] } [15:31:59.154] { [15:31:59.154] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:59.154] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:59.154] ...future.FUN(...future.X_jj, ...) [15:31:59.154] }) [15:31:59.154] } [15:31:59.154] }, args = future.call.arguments) [15:31:59.154] } [15:31:59.155] Tweak future expression to call with '...' arguments ... DONE [15:31:59.156] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:59.156] - packages: [1] 'future' [15:31:59.157] getGlobalsAndPackages() ... DONE [15:31:59.157] run() for 'Future' ... [15:31:59.158] - state: 'created' [15:31:59.158] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:59.177] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:59.177] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:59.178] - Field: 'node' [15:31:59.178] - Field: 'label' [15:31:59.178] - Field: 'local' [15:31:59.179] - Field: 'owner' [15:31:59.179] - Field: 'envir' [15:31:59.179] - Field: 'workers' [15:31:59.180] - Field: 'packages' [15:31:59.180] - Field: 'gc' [15:31:59.180] - Field: 'conditions' [15:31:59.181] - Field: 'persistent' [15:31:59.181] - Field: 'expr' [15:31:59.181] - Field: 'uuid' [15:31:59.181] - Field: 'seed' [15:31:59.182] - Field: 'version' [15:31:59.182] - Field: 'result' [15:31:59.182] - Field: 'asynchronous' [15:31:59.183] - Field: 'calls' [15:31:59.183] - Field: 'globals' [15:31:59.183] - Field: 'stdout' [15:31:59.184] - Field: 'earlySignal' [15:31:59.184] - Field: 'lazy' [15:31:59.184] - Field: 'state' [15:31:59.185] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:59.185] - Launch lazy future ... [15:31:59.186] Packages needed by the future expression (n = 1): 'future' [15:31:59.186] Packages needed by future strategies (n = 0): [15:31:59.187] { [15:31:59.187] { [15:31:59.187] { [15:31:59.187] ...future.startTime <- base::Sys.time() [15:31:59.187] { [15:31:59.187] { [15:31:59.187] { [15:31:59.187] { [15:31:59.187] { [15:31:59.187] base::local({ [15:31:59.187] has_future <- base::requireNamespace("future", [15:31:59.187] quietly = TRUE) [15:31:59.187] if (has_future) { [15:31:59.187] ns <- base::getNamespace("future") [15:31:59.187] version <- ns[[".package"]][["version"]] [15:31:59.187] if (is.null(version)) [15:31:59.187] version <- utils::packageVersion("future") [15:31:59.187] } [15:31:59.187] else { [15:31:59.187] version <- NULL [15:31:59.187] } [15:31:59.187] if (!has_future || version < "1.8.0") { [15:31:59.187] info <- base::c(r_version = base::gsub("R version ", [15:31:59.187] "", base::R.version$version.string), [15:31:59.187] platform = base::sprintf("%s (%s-bit)", [15:31:59.187] base::R.version$platform, 8 * [15:31:59.187] base::.Machine$sizeof.pointer), [15:31:59.187] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:59.187] "release", "version")], collapse = " "), [15:31:59.187] hostname = base::Sys.info()[["nodename"]]) [15:31:59.187] info <- base::sprintf("%s: %s", base::names(info), [15:31:59.187] info) [15:31:59.187] info <- base::paste(info, collapse = "; ") [15:31:59.187] if (!has_future) { [15:31:59.187] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:59.187] info) [15:31:59.187] } [15:31:59.187] else { [15:31:59.187] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:59.187] info, version) [15:31:59.187] } [15:31:59.187] base::stop(msg) [15:31:59.187] } [15:31:59.187] }) [15:31:59.187] } [15:31:59.187] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:59.187] base::options(mc.cores = 1L) [15:31:59.187] } [15:31:59.187] base::local({ [15:31:59.187] for (pkg in "future") { [15:31:59.187] base::loadNamespace(pkg) [15:31:59.187] base::library(pkg, character.only = TRUE) [15:31:59.187] } [15:31:59.187] }) [15:31:59.187] } [15:31:59.187] ...future.strategy.old <- future::plan("list") [15:31:59.187] options(future.plan = NULL) [15:31:59.187] Sys.unsetenv("R_FUTURE_PLAN") [15:31:59.187] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:59.187] } [15:31:59.187] ...future.workdir <- getwd() [15:31:59.187] } [15:31:59.187] ...future.oldOptions <- base::as.list(base::.Options) [15:31:59.187] ...future.oldEnvVars <- base::Sys.getenv() [15:31:59.187] } [15:31:59.187] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:59.187] future.globals.maxSize = NULL, future.globals.method = NULL, [15:31:59.187] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:59.187] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:59.187] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:59.187] future.stdout.windows.reencode = NULL, width = 80L) [15:31:59.187] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:59.187] base::names(...future.oldOptions)) [15:31:59.187] } [15:31:59.187] if (FALSE) { [15:31:59.187] } [15:31:59.187] else { [15:31:59.187] if (TRUE) { [15:31:59.187] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:59.187] open = "w") [15:31:59.187] } [15:31:59.187] else { [15:31:59.187] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:59.187] windows = "NUL", "/dev/null"), open = "w") [15:31:59.187] } [15:31:59.187] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:59.187] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:59.187] base::sink(type = "output", split = FALSE) [15:31:59.187] base::close(...future.stdout) [15:31:59.187] }, add = TRUE) [15:31:59.187] } [15:31:59.187] ...future.frame <- base::sys.nframe() [15:31:59.187] ...future.conditions <- base::list() [15:31:59.187] ...future.rng <- base::globalenv()$.Random.seed [15:31:59.187] if (FALSE) { [15:31:59.187] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:59.187] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:59.187] } [15:31:59.187] ...future.result <- base::tryCatch({ [15:31:59.187] base::withCallingHandlers({ [15:31:59.187] ...future.value <- base::withVisible(base::local({ [15:31:59.187] ...future.makeSendCondition <- base::local({ [15:31:59.187] sendCondition <- NULL [15:31:59.187] function(frame = 1L) { [15:31:59.187] if (is.function(sendCondition)) [15:31:59.187] return(sendCondition) [15:31:59.187] ns <- getNamespace("parallel") [15:31:59.187] if (exists("sendData", mode = "function", [15:31:59.187] envir = ns)) { [15:31:59.187] parallel_sendData <- get("sendData", mode = "function", [15:31:59.187] envir = ns) [15:31:59.187] envir <- sys.frame(frame) [15:31:59.187] master <- NULL [15:31:59.187] while (!identical(envir, .GlobalEnv) && [15:31:59.187] !identical(envir, emptyenv())) { [15:31:59.187] if (exists("master", mode = "list", envir = envir, [15:31:59.187] inherits = FALSE)) { [15:31:59.187] master <- get("master", mode = "list", [15:31:59.187] envir = envir, inherits = FALSE) [15:31:59.187] if (inherits(master, c("SOCKnode", [15:31:59.187] "SOCK0node"))) { [15:31:59.187] sendCondition <<- function(cond) { [15:31:59.187] data <- list(type = "VALUE", value = cond, [15:31:59.187] success = TRUE) [15:31:59.187] parallel_sendData(master, data) [15:31:59.187] } [15:31:59.187] return(sendCondition) [15:31:59.187] } [15:31:59.187] } [15:31:59.187] frame <- frame + 1L [15:31:59.187] envir <- sys.frame(frame) [15:31:59.187] } [15:31:59.187] } [15:31:59.187] sendCondition <<- function(cond) NULL [15:31:59.187] } [15:31:59.187] }) [15:31:59.187] withCallingHandlers({ [15:31:59.187] { [15:31:59.187] do.call(function(...) { [15:31:59.187] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:59.187] if (!identical(...future.globals.maxSize.org, [15:31:59.187] ...future.globals.maxSize)) { [15:31:59.187] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:59.187] on.exit(options(oopts), add = TRUE) [15:31:59.187] } [15:31:59.187] { [15:31:59.187] lapply(seq_along(...future.elements_ii), [15:31:59.187] FUN = function(jj) { [15:31:59.187] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:59.187] ...future.FUN(...future.X_jj, ...) [15:31:59.187] }) [15:31:59.187] } [15:31:59.187] }, args = future.call.arguments) [15:31:59.187] } [15:31:59.187] }, immediateCondition = function(cond) { [15:31:59.187] sendCondition <- ...future.makeSendCondition() [15:31:59.187] sendCondition(cond) [15:31:59.187] muffleCondition <- function (cond, pattern = "^muffle") [15:31:59.187] { [15:31:59.187] inherits <- base::inherits [15:31:59.187] invokeRestart <- base::invokeRestart [15:31:59.187] is.null <- base::is.null [15:31:59.187] muffled <- FALSE [15:31:59.187] if (inherits(cond, "message")) { [15:31:59.187] muffled <- grepl(pattern, "muffleMessage") [15:31:59.187] if (muffled) [15:31:59.187] invokeRestart("muffleMessage") [15:31:59.187] } [15:31:59.187] else if (inherits(cond, "warning")) { [15:31:59.187] muffled <- grepl(pattern, "muffleWarning") [15:31:59.187] if (muffled) [15:31:59.187] invokeRestart("muffleWarning") [15:31:59.187] } [15:31:59.187] else if (inherits(cond, "condition")) { [15:31:59.187] if (!is.null(pattern)) { [15:31:59.187] computeRestarts <- base::computeRestarts [15:31:59.187] grepl <- base::grepl [15:31:59.187] restarts <- computeRestarts(cond) [15:31:59.187] for (restart in restarts) { [15:31:59.187] name <- restart$name [15:31:59.187] if (is.null(name)) [15:31:59.187] next [15:31:59.187] if (!grepl(pattern, name)) [15:31:59.187] next [15:31:59.187] invokeRestart(restart) [15:31:59.187] muffled <- TRUE [15:31:59.187] break [15:31:59.187] } [15:31:59.187] } [15:31:59.187] } [15:31:59.187] invisible(muffled) [15:31:59.187] } [15:31:59.187] muffleCondition(cond) [15:31:59.187] }) [15:31:59.187] })) [15:31:59.187] future::FutureResult(value = ...future.value$value, [15:31:59.187] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:59.187] ...future.rng), globalenv = if (FALSE) [15:31:59.187] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:59.187] ...future.globalenv.names)) [15:31:59.187] else NULL, started = ...future.startTime, version = "1.8") [15:31:59.187] }, condition = base::local({ [15:31:59.187] c <- base::c [15:31:59.187] inherits <- base::inherits [15:31:59.187] invokeRestart <- base::invokeRestart [15:31:59.187] length <- base::length [15:31:59.187] list <- base::list [15:31:59.187] seq.int <- base::seq.int [15:31:59.187] signalCondition <- base::signalCondition [15:31:59.187] sys.calls <- base::sys.calls [15:31:59.187] `[[` <- base::`[[` [15:31:59.187] `+` <- base::`+` [15:31:59.187] `<<-` <- base::`<<-` [15:31:59.187] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:59.187] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:59.187] 3L)] [15:31:59.187] } [15:31:59.187] function(cond) { [15:31:59.187] is_error <- inherits(cond, "error") [15:31:59.187] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:59.187] NULL) [15:31:59.187] if (is_error) { [15:31:59.187] sessionInformation <- function() { [15:31:59.187] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:59.187] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:59.187] search = base::search(), system = base::Sys.info()) [15:31:59.187] } [15:31:59.187] ...future.conditions[[length(...future.conditions) + [15:31:59.187] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:59.187] cond$call), session = sessionInformation(), [15:31:59.187] timestamp = base::Sys.time(), signaled = 0L) [15:31:59.187] signalCondition(cond) [15:31:59.187] } [15:31:59.187] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:59.187] "immediateCondition"))) { [15:31:59.187] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:59.187] ...future.conditions[[length(...future.conditions) + [15:31:59.187] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:59.187] if (TRUE && !signal) { [15:31:59.187] muffleCondition <- function (cond, pattern = "^muffle") [15:31:59.187] { [15:31:59.187] inherits <- base::inherits [15:31:59.187] invokeRestart <- base::invokeRestart [15:31:59.187] is.null <- base::is.null [15:31:59.187] muffled <- FALSE [15:31:59.187] if (inherits(cond, "message")) { [15:31:59.187] muffled <- grepl(pattern, "muffleMessage") [15:31:59.187] if (muffled) [15:31:59.187] invokeRestart("muffleMessage") [15:31:59.187] } [15:31:59.187] else if (inherits(cond, "warning")) { [15:31:59.187] muffled <- grepl(pattern, "muffleWarning") [15:31:59.187] if (muffled) [15:31:59.187] invokeRestart("muffleWarning") [15:31:59.187] } [15:31:59.187] else if (inherits(cond, "condition")) { [15:31:59.187] if (!is.null(pattern)) { [15:31:59.187] computeRestarts <- base::computeRestarts [15:31:59.187] grepl <- base::grepl [15:31:59.187] restarts <- computeRestarts(cond) [15:31:59.187] for (restart in restarts) { [15:31:59.187] name <- restart$name [15:31:59.187] if (is.null(name)) [15:31:59.187] next [15:31:59.187] if (!grepl(pattern, name)) [15:31:59.187] next [15:31:59.187] invokeRestart(restart) [15:31:59.187] muffled <- TRUE [15:31:59.187] break [15:31:59.187] } [15:31:59.187] } [15:31:59.187] } [15:31:59.187] invisible(muffled) [15:31:59.187] } [15:31:59.187] muffleCondition(cond, pattern = "^muffle") [15:31:59.187] } [15:31:59.187] } [15:31:59.187] else { [15:31:59.187] if (TRUE) { [15:31:59.187] muffleCondition <- function (cond, pattern = "^muffle") [15:31:59.187] { [15:31:59.187] inherits <- base::inherits [15:31:59.187] invokeRestart <- base::invokeRestart [15:31:59.187] is.null <- base::is.null [15:31:59.187] muffled <- FALSE [15:31:59.187] if (inherits(cond, "message")) { [15:31:59.187] muffled <- grepl(pattern, "muffleMessage") [15:31:59.187] if (muffled) [15:31:59.187] invokeRestart("muffleMessage") [15:31:59.187] } [15:31:59.187] else if (inherits(cond, "warning")) { [15:31:59.187] muffled <- grepl(pattern, "muffleWarning") [15:31:59.187] if (muffled) [15:31:59.187] invokeRestart("muffleWarning") [15:31:59.187] } [15:31:59.187] else if (inherits(cond, "condition")) { [15:31:59.187] if (!is.null(pattern)) { [15:31:59.187] computeRestarts <- base::computeRestarts [15:31:59.187] grepl <- base::grepl [15:31:59.187] restarts <- computeRestarts(cond) [15:31:59.187] for (restart in restarts) { [15:31:59.187] name <- restart$name [15:31:59.187] if (is.null(name)) [15:31:59.187] next [15:31:59.187] if (!grepl(pattern, name)) [15:31:59.187] next [15:31:59.187] invokeRestart(restart) [15:31:59.187] muffled <- TRUE [15:31:59.187] break [15:31:59.187] } [15:31:59.187] } [15:31:59.187] } [15:31:59.187] invisible(muffled) [15:31:59.187] } [15:31:59.187] muffleCondition(cond, pattern = "^muffle") [15:31:59.187] } [15:31:59.187] } [15:31:59.187] } [15:31:59.187] })) [15:31:59.187] }, error = function(ex) { [15:31:59.187] base::structure(base::list(value = NULL, visible = NULL, [15:31:59.187] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:59.187] ...future.rng), started = ...future.startTime, [15:31:59.187] finished = Sys.time(), session_uuid = NA_character_, [15:31:59.187] version = "1.8"), class = "FutureResult") [15:31:59.187] }, finally = { [15:31:59.187] if (!identical(...future.workdir, getwd())) [15:31:59.187] setwd(...future.workdir) [15:31:59.187] { [15:31:59.187] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:59.187] ...future.oldOptions$nwarnings <- NULL [15:31:59.187] } [15:31:59.187] base::options(...future.oldOptions) [15:31:59.187] if (.Platform$OS.type == "windows") { [15:31:59.187] old_names <- names(...future.oldEnvVars) [15:31:59.187] envs <- base::Sys.getenv() [15:31:59.187] names <- names(envs) [15:31:59.187] common <- intersect(names, old_names) [15:31:59.187] added <- setdiff(names, old_names) [15:31:59.187] removed <- setdiff(old_names, names) [15:31:59.187] changed <- common[...future.oldEnvVars[common] != [15:31:59.187] envs[common]] [15:31:59.187] NAMES <- toupper(changed) [15:31:59.187] args <- list() [15:31:59.187] for (kk in seq_along(NAMES)) { [15:31:59.187] name <- changed[[kk]] [15:31:59.187] NAME <- NAMES[[kk]] [15:31:59.187] if (name != NAME && is.element(NAME, old_names)) [15:31:59.187] next [15:31:59.187] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:59.187] } [15:31:59.187] NAMES <- toupper(added) [15:31:59.187] for (kk in seq_along(NAMES)) { [15:31:59.187] name <- added[[kk]] [15:31:59.187] NAME <- NAMES[[kk]] [15:31:59.187] if (name != NAME && is.element(NAME, old_names)) [15:31:59.187] next [15:31:59.187] args[[name]] <- "" [15:31:59.187] } [15:31:59.187] NAMES <- toupper(removed) [15:31:59.187] for (kk in seq_along(NAMES)) { [15:31:59.187] name <- removed[[kk]] [15:31:59.187] NAME <- NAMES[[kk]] [15:31:59.187] if (name != NAME && is.element(NAME, old_names)) [15:31:59.187] next [15:31:59.187] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:59.187] } [15:31:59.187] if (length(args) > 0) [15:31:59.187] base::do.call(base::Sys.setenv, args = args) [15:31:59.187] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:59.187] } [15:31:59.187] else { [15:31:59.187] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:59.187] } [15:31:59.187] { [15:31:59.187] if (base::length(...future.futureOptionsAdded) > [15:31:59.187] 0L) { [15:31:59.187] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:59.187] base::names(opts) <- ...future.futureOptionsAdded [15:31:59.187] base::options(opts) [15:31:59.187] } [15:31:59.187] { [15:31:59.187] { [15:31:59.187] base::options(mc.cores = ...future.mc.cores.old) [15:31:59.187] NULL [15:31:59.187] } [15:31:59.187] options(future.plan = NULL) [15:31:59.187] if (is.na(NA_character_)) [15:31:59.187] Sys.unsetenv("R_FUTURE_PLAN") [15:31:59.187] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:59.187] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:59.187] .init = FALSE) [15:31:59.187] } [15:31:59.187] } [15:31:59.187] } [15:31:59.187] }) [15:31:59.187] if (TRUE) { [15:31:59.187] base::sink(type = "output", split = FALSE) [15:31:59.187] if (TRUE) { [15:31:59.187] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:59.187] } [15:31:59.187] else { [15:31:59.187] ...future.result["stdout"] <- base::list(NULL) [15:31:59.187] } [15:31:59.187] base::close(...future.stdout) [15:31:59.187] ...future.stdout <- NULL [15:31:59.187] } [15:31:59.187] ...future.result$conditions <- ...future.conditions [15:31:59.187] ...future.result$finished <- base::Sys.time() [15:31:59.187] ...future.result [15:31:59.187] } [15:31:59.197] Exporting 5 global objects (69.78 KiB) to cluster node #1 ... [15:31:59.197] Exporting '...future.FUN' (69.62 KiB) to cluster node #1 ... [15:31:59.198] Exporting '...future.FUN' (69.62 KiB) to cluster node #1 ... DONE [15:31:59.199] Exporting 'future.call.arguments' (168 bytes) to cluster node #1 ... [15:31:59.199] Exporting 'future.call.arguments' (168 bytes) to cluster node #1 ... DONE [15:31:59.200] Exporting '...future.elements_ii' (12.83 KiB) to cluster node #1 ... [15:31:59.201] Exporting '...future.elements_ii' (12.83 KiB) to cluster node #1 ... DONE [15:31:59.201] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:59.202] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:59.202] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:59.203] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:59.203] Exporting 5 global objects (69.78 KiB) to cluster node #1 ... DONE [15:31:59.204] MultisessionFuture started [15:31:59.204] - Launch lazy future ... done [15:31:59.205] run() for 'MultisessionFuture' ... done [15:31:59.205] Created future: [15:31:59.222] receiveMessageFromWorker() for ClusterFuture ... [15:31:59.223] - Validating connection of MultisessionFuture [15:31:59.224] - received message: FutureResult [15:31:59.224] - Received FutureResult [15:31:59.224] - Erased future from FutureRegistry [15:31:59.225] result() for ClusterFuture ... [15:31:59.225] - result already collected: FutureResult [15:31:59.226] result() for ClusterFuture ... done [15:31:59.226] receiveMessageFromWorker() for ClusterFuture ... done [15:31:59.205] MultisessionFuture: [15:31:59.205] Label: 'future_lapply-1' [15:31:59.205] Expression: [15:31:59.205] { [15:31:59.205] do.call(function(...) { [15:31:59.205] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:59.205] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:59.205] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:59.205] on.exit(options(oopts), add = TRUE) [15:31:59.205] } [15:31:59.205] { [15:31:59.205] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:59.205] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:59.205] ...future.FUN(...future.X_jj, ...) [15:31:59.205] }) [15:31:59.205] } [15:31:59.205] }, args = future.call.arguments) [15:31:59.205] } [15:31:59.205] Lazy evaluation: FALSE [15:31:59.205] Asynchronous evaluation: TRUE [15:31:59.205] Local evaluation: TRUE [15:31:59.205] Environment: R_GlobalEnv [15:31:59.205] Capture standard output: TRUE [15:31:59.205] Capture condition classes: 'condition' (excluding 'nothing') [15:31:59.205] Globals: 5 objects totaling 82.61 KiB (function '...future.FUN' of 69.62 KiB, DotDotDotList 'future.call.arguments' of 168 bytes, list '...future.elements_ii' of 12.83 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:59.205] Packages: 1 packages ('future') [15:31:59.205] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:59.205] Resolved: TRUE [15:31:59.205] Value: [15:31:59.205] Conditions captured: [15:31:59.205] Early signaling: FALSE [15:31:59.205] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:59.205] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:59.227] Chunk #1 of 1 ... DONE [15:31:59.227] Launching 1 futures (chunks) ... DONE [15:31:59.227] Resolving 1 futures (chunks) ... [15:31:59.228] resolve() on list ... [15:31:59.228] recursive: 0 [15:31:59.228] length: 1 [15:31:59.228] [15:31:59.229] Future #1 [15:31:59.229] result() for ClusterFuture ... [15:31:59.229] - result already collected: FutureResult [15:31:59.230] result() for ClusterFuture ... done [15:31:59.230] result() for ClusterFuture ... [15:31:59.230] - result already collected: FutureResult [15:31:59.231] result() for ClusterFuture ... done [15:31:59.231] signalConditionsASAP(MultisessionFuture, pos=1) ... [15:31:59.231] - nx: 1 [15:31:59.231] - relay: TRUE [15:31:59.232] - stdout: TRUE [15:31:59.232] - signal: TRUE [15:31:59.232] - resignal: FALSE [15:31:59.232] - force: TRUE [15:31:59.233] - relayed: [n=1] FALSE [15:31:59.233] - queued futures: [n=1] FALSE [15:31:59.233] - until=1 [15:31:59.233] - relaying element #1 [15:31:59.234] result() for ClusterFuture ... [15:31:59.234] - result already collected: FutureResult [15:31:59.234] result() for ClusterFuture ... done [15:31:59.234] result() for ClusterFuture ... [15:31:59.234] - result already collected: FutureResult [15:31:59.234] result() for ClusterFuture ... done [15:31:59.235] result() for ClusterFuture ... [15:31:59.235] - result already collected: FutureResult [15:31:59.235] result() for ClusterFuture ... done [15:31:59.235] result() for ClusterFuture ... [15:31:59.235] - result already collected: FutureResult [15:31:59.236] result() for ClusterFuture ... done [15:31:59.236] - relayed: [n=1] TRUE [15:31:59.236] - queued futures: [n=1] TRUE [15:31:59.236] signalConditionsASAP(MultisessionFuture, pos=1) ... done [15:31:59.236] length: 0 (resolved future 1) [15:31:59.236] Relaying remaining futures [15:31:59.237] signalConditionsASAP(NULL, pos=0) ... [15:31:59.237] - nx: 1 [15:31:59.237] - relay: TRUE [15:31:59.237] - stdout: TRUE [15:31:59.237] - signal: TRUE [15:31:59.237] - resignal: FALSE [15:31:59.238] - force: TRUE [15:31:59.238] - relayed: [n=1] TRUE [15:31:59.238] - queued futures: [n=1] TRUE - flush all [15:31:59.238] - relayed: [n=1] TRUE [15:31:59.238] - queued futures: [n=1] TRUE [15:31:59.239] signalConditionsASAP(NULL, pos=0) ... done [15:31:59.239] resolve() on list ... DONE [15:31:59.239] result() for ClusterFuture ... [15:31:59.239] - result already collected: FutureResult [15:31:59.239] result() for ClusterFuture ... done [15:31:59.239] result() for ClusterFuture ... [15:31:59.240] - result already collected: FutureResult [15:31:59.240] result() for ClusterFuture ... done [15:31:59.240] - Number of value chunks collected: 1 [15:31:59.240] Resolving 1 futures (chunks) ... DONE [15:31:59.240] Reducing values from 1 chunks ... [15:31:59.240] - Number of values collected after concatenation: 1 [15:31:59.241] - Number of values expected: 1 [15:31:59.241] Reducing values from 1 chunks ... DONE [15:31:59.241] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [15:31:59.243] future_lapply() ... [15:31:59.246] Number of chunks: 2 [15:31:59.247] Index remapping (attribute 'ordering'): [n = 2] 1, 2 [15:31:59.247] getGlobalsAndPackagesXApply() ... [15:31:59.247] - future.globals: TRUE [15:31:59.247] getGlobalsAndPackages() ... [15:31:59.247] Searching for globals... [15:31:59.249] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [15:31:59.249] Searching for globals ... DONE [15:31:59.250] Resolving globals: FALSE [15:31:59.250] The total size of the 1 globals is 4.85 KiB (4968 bytes) [15:31:59.251] The total size of the 1 globals exported for future expression ('FUN()') is 4.85 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (4.85 KiB of class 'function') [15:31:59.251] - globals: [1] 'FUN' [15:31:59.251] - packages: [1] 'listenv' [15:31:59.251] getGlobalsAndPackages() ... DONE [15:31:59.252] - globals found/used: [n=1] 'FUN' [15:31:59.252] - needed namespaces: [n=1] 'listenv' [15:31:59.252] Finding globals ... DONE [15:31:59.252] - use_args: TRUE [15:31:59.252] - Getting '...' globals ... [15:31:59.253] resolve() on list ... [15:31:59.253] recursive: 0 [15:31:59.253] length: 1 [15:31:59.253] elements: '...' [15:31:59.253] length: 0 (resolved future 1) [15:31:59.254] resolve() on list ... DONE [15:31:59.254] - '...' content: [n=0] [15:31:59.254] List of 1 [15:31:59.254] $ ...: list() [15:31:59.254] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:59.254] - attr(*, "where")=List of 1 [15:31:59.254] ..$ ...: [15:31:59.254] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:59.254] - attr(*, "resolved")= logi TRUE [15:31:59.254] - attr(*, "total_size")= num NA [15:31:59.257] - Getting '...' globals ... DONE [15:31:59.258] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:59.258] List of 2 [15:31:59.258] $ ...future.FUN:function (x, ...) [15:31:59.258] $ ... : list() [15:31:59.258] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:59.258] - attr(*, "where")=List of 2 [15:31:59.258] ..$ ...future.FUN: [15:31:59.258] ..$ ... : [15:31:59.258] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:59.258] - attr(*, "resolved")= logi FALSE [15:31:59.258] - attr(*, "total_size")= num 4968 [15:31:59.261] Packages to be attached in all futures: [n=1] 'listenv' [15:31:59.262] getGlobalsAndPackagesXApply() ... DONE [15:31:59.262] Number of futures (= number of chunks): 2 [15:31:59.262] Launching 2 futures (chunks) ... [15:31:59.262] Chunk #1 of 2 ... [15:31:59.262] - Finding globals in 'X' for chunk #1 ... [15:31:59.263] getGlobalsAndPackages() ... [15:31:59.263] Searching for globals... [15:31:59.263] [15:31:59.264] Searching for globals ... DONE [15:31:59.264] - globals: [0] [15:31:59.264] getGlobalsAndPackages() ... DONE [15:31:59.264] + additional globals found: [n=0] [15:31:59.264] + additional namespaces needed: [n=0] [15:31:59.265] - Finding globals in 'X' for chunk #1 ... DONE [15:31:59.265] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:59.265] - seeds: [15:31:59.265] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:59.265] getGlobalsAndPackages() ... [15:31:59.265] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:59.266] Resolving globals: FALSE [15:31:59.266] Tweak future expression to call with '...' arguments ... [15:31:59.266] { [15:31:59.266] do.call(function(...) { [15:31:59.266] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:59.266] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:59.266] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:59.266] on.exit(options(oopts), add = TRUE) [15:31:59.266] } [15:31:59.266] { [15:31:59.266] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:59.266] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:59.266] ...future.FUN(...future.X_jj, ...) [15:31:59.266] }) [15:31:59.266] } [15:31:59.266] }, args = future.call.arguments) [15:31:59.266] } [15:31:59.267] Tweak future expression to call with '...' arguments ... DONE [15:31:59.267] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:59.267] - packages: [1] 'listenv' [15:31:59.268] getGlobalsAndPackages() ... DONE [15:31:59.268] run() for 'Future' ... [15:31:59.268] - state: 'created' [15:31:59.268] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:59.284] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:59.284] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:59.284] - Field: 'node' [15:31:59.284] - Field: 'label' [15:31:59.285] - Field: 'local' [15:31:59.285] - Field: 'owner' [15:31:59.285] - Field: 'envir' [15:31:59.285] - Field: 'workers' [15:31:59.285] - Field: 'packages' [15:31:59.286] - Field: 'gc' [15:31:59.286] - Field: 'conditions' [15:31:59.286] - Field: 'persistent' [15:31:59.286] - Field: 'expr' [15:31:59.286] - Field: 'uuid' [15:31:59.286] - Field: 'seed' [15:31:59.287] - Field: 'version' [15:31:59.287] - Field: 'result' [15:31:59.287] - Field: 'asynchronous' [15:31:59.287] - Field: 'calls' [15:31:59.287] - Field: 'globals' [15:31:59.288] - Field: 'stdout' [15:31:59.288] - Field: 'earlySignal' [15:31:59.288] - Field: 'lazy' [15:31:59.288] - Field: 'state' [15:31:59.288] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:59.289] - Launch lazy future ... [15:31:59.289] Packages needed by the future expression (n = 1): 'listenv' [15:31:59.289] Packages needed by future strategies (n = 0): [15:31:59.290] { [15:31:59.290] { [15:31:59.290] { [15:31:59.290] ...future.startTime <- base::Sys.time() [15:31:59.290] { [15:31:59.290] { [15:31:59.290] { [15:31:59.290] { [15:31:59.290] { [15:31:59.290] base::local({ [15:31:59.290] has_future <- base::requireNamespace("future", [15:31:59.290] quietly = TRUE) [15:31:59.290] if (has_future) { [15:31:59.290] ns <- base::getNamespace("future") [15:31:59.290] version <- ns[[".package"]][["version"]] [15:31:59.290] if (is.null(version)) [15:31:59.290] version <- utils::packageVersion("future") [15:31:59.290] } [15:31:59.290] else { [15:31:59.290] version <- NULL [15:31:59.290] } [15:31:59.290] if (!has_future || version < "1.8.0") { [15:31:59.290] info <- base::c(r_version = base::gsub("R version ", [15:31:59.290] "", base::R.version$version.string), [15:31:59.290] platform = base::sprintf("%s (%s-bit)", [15:31:59.290] base::R.version$platform, 8 * [15:31:59.290] base::.Machine$sizeof.pointer), [15:31:59.290] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:59.290] "release", "version")], collapse = " "), [15:31:59.290] hostname = base::Sys.info()[["nodename"]]) [15:31:59.290] info <- base::sprintf("%s: %s", base::names(info), [15:31:59.290] info) [15:31:59.290] info <- base::paste(info, collapse = "; ") [15:31:59.290] if (!has_future) { [15:31:59.290] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:59.290] info) [15:31:59.290] } [15:31:59.290] else { [15:31:59.290] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:59.290] info, version) [15:31:59.290] } [15:31:59.290] base::stop(msg) [15:31:59.290] } [15:31:59.290] }) [15:31:59.290] } [15:31:59.290] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:59.290] base::options(mc.cores = 1L) [15:31:59.290] } [15:31:59.290] base::local({ [15:31:59.290] for (pkg in "listenv") { [15:31:59.290] base::loadNamespace(pkg) [15:31:59.290] base::library(pkg, character.only = TRUE) [15:31:59.290] } [15:31:59.290] }) [15:31:59.290] } [15:31:59.290] ...future.strategy.old <- future::plan("list") [15:31:59.290] options(future.plan = NULL) [15:31:59.290] Sys.unsetenv("R_FUTURE_PLAN") [15:31:59.290] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:59.290] } [15:31:59.290] ...future.workdir <- getwd() [15:31:59.290] } [15:31:59.290] ...future.oldOptions <- base::as.list(base::.Options) [15:31:59.290] ...future.oldEnvVars <- base::Sys.getenv() [15:31:59.290] } [15:31:59.290] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:59.290] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:59.290] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:59.290] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:59.290] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:59.290] future.stdout.windows.reencode = NULL, width = 80L) [15:31:59.290] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:59.290] base::names(...future.oldOptions)) [15:31:59.290] } [15:31:59.290] if (FALSE) { [15:31:59.290] } [15:31:59.290] else { [15:31:59.290] if (TRUE) { [15:31:59.290] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:59.290] open = "w") [15:31:59.290] } [15:31:59.290] else { [15:31:59.290] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:59.290] windows = "NUL", "/dev/null"), open = "w") [15:31:59.290] } [15:31:59.290] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:59.290] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:59.290] base::sink(type = "output", split = FALSE) [15:31:59.290] base::close(...future.stdout) [15:31:59.290] }, add = TRUE) [15:31:59.290] } [15:31:59.290] ...future.frame <- base::sys.nframe() [15:31:59.290] ...future.conditions <- base::list() [15:31:59.290] ...future.rng <- base::globalenv()$.Random.seed [15:31:59.290] if (FALSE) { [15:31:59.290] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:59.290] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:59.290] } [15:31:59.290] ...future.result <- base::tryCatch({ [15:31:59.290] base::withCallingHandlers({ [15:31:59.290] ...future.value <- base::withVisible(base::local({ [15:31:59.290] ...future.makeSendCondition <- base::local({ [15:31:59.290] sendCondition <- NULL [15:31:59.290] function(frame = 1L) { [15:31:59.290] if (is.function(sendCondition)) [15:31:59.290] return(sendCondition) [15:31:59.290] ns <- getNamespace("parallel") [15:31:59.290] if (exists("sendData", mode = "function", [15:31:59.290] envir = ns)) { [15:31:59.290] parallel_sendData <- get("sendData", mode = "function", [15:31:59.290] envir = ns) [15:31:59.290] envir <- sys.frame(frame) [15:31:59.290] master <- NULL [15:31:59.290] while (!identical(envir, .GlobalEnv) && [15:31:59.290] !identical(envir, emptyenv())) { [15:31:59.290] if (exists("master", mode = "list", envir = envir, [15:31:59.290] inherits = FALSE)) { [15:31:59.290] master <- get("master", mode = "list", [15:31:59.290] envir = envir, inherits = FALSE) [15:31:59.290] if (inherits(master, c("SOCKnode", [15:31:59.290] "SOCK0node"))) { [15:31:59.290] sendCondition <<- function(cond) { [15:31:59.290] data <- list(type = "VALUE", value = cond, [15:31:59.290] success = TRUE) [15:31:59.290] parallel_sendData(master, data) [15:31:59.290] } [15:31:59.290] return(sendCondition) [15:31:59.290] } [15:31:59.290] } [15:31:59.290] frame <- frame + 1L [15:31:59.290] envir <- sys.frame(frame) [15:31:59.290] } [15:31:59.290] } [15:31:59.290] sendCondition <<- function(cond) NULL [15:31:59.290] } [15:31:59.290] }) [15:31:59.290] withCallingHandlers({ [15:31:59.290] { [15:31:59.290] do.call(function(...) { [15:31:59.290] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:59.290] if (!identical(...future.globals.maxSize.org, [15:31:59.290] ...future.globals.maxSize)) { [15:31:59.290] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:59.290] on.exit(options(oopts), add = TRUE) [15:31:59.290] } [15:31:59.290] { [15:31:59.290] lapply(seq_along(...future.elements_ii), [15:31:59.290] FUN = function(jj) { [15:31:59.290] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:59.290] ...future.FUN(...future.X_jj, ...) [15:31:59.290] }) [15:31:59.290] } [15:31:59.290] }, args = future.call.arguments) [15:31:59.290] } [15:31:59.290] }, immediateCondition = function(cond) { [15:31:59.290] sendCondition <- ...future.makeSendCondition() [15:31:59.290] sendCondition(cond) [15:31:59.290] muffleCondition <- function (cond, pattern = "^muffle") [15:31:59.290] { [15:31:59.290] inherits <- base::inherits [15:31:59.290] invokeRestart <- base::invokeRestart [15:31:59.290] is.null <- base::is.null [15:31:59.290] muffled <- FALSE [15:31:59.290] if (inherits(cond, "message")) { [15:31:59.290] muffled <- grepl(pattern, "muffleMessage") [15:31:59.290] if (muffled) [15:31:59.290] invokeRestart("muffleMessage") [15:31:59.290] } [15:31:59.290] else if (inherits(cond, "warning")) { [15:31:59.290] muffled <- grepl(pattern, "muffleWarning") [15:31:59.290] if (muffled) [15:31:59.290] invokeRestart("muffleWarning") [15:31:59.290] } [15:31:59.290] else if (inherits(cond, "condition")) { [15:31:59.290] if (!is.null(pattern)) { [15:31:59.290] computeRestarts <- base::computeRestarts [15:31:59.290] grepl <- base::grepl [15:31:59.290] restarts <- computeRestarts(cond) [15:31:59.290] for (restart in restarts) { [15:31:59.290] name <- restart$name [15:31:59.290] if (is.null(name)) [15:31:59.290] next [15:31:59.290] if (!grepl(pattern, name)) [15:31:59.290] next [15:31:59.290] invokeRestart(restart) [15:31:59.290] muffled <- TRUE [15:31:59.290] break [15:31:59.290] } [15:31:59.290] } [15:31:59.290] } [15:31:59.290] invisible(muffled) [15:31:59.290] } [15:31:59.290] muffleCondition(cond) [15:31:59.290] }) [15:31:59.290] })) [15:31:59.290] future::FutureResult(value = ...future.value$value, [15:31:59.290] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:59.290] ...future.rng), globalenv = if (FALSE) [15:31:59.290] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:59.290] ...future.globalenv.names)) [15:31:59.290] else NULL, started = ...future.startTime, version = "1.8") [15:31:59.290] }, condition = base::local({ [15:31:59.290] c <- base::c [15:31:59.290] inherits <- base::inherits [15:31:59.290] invokeRestart <- base::invokeRestart [15:31:59.290] length <- base::length [15:31:59.290] list <- base::list [15:31:59.290] seq.int <- base::seq.int [15:31:59.290] signalCondition <- base::signalCondition [15:31:59.290] sys.calls <- base::sys.calls [15:31:59.290] `[[` <- base::`[[` [15:31:59.290] `+` <- base::`+` [15:31:59.290] `<<-` <- base::`<<-` [15:31:59.290] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:59.290] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:59.290] 3L)] [15:31:59.290] } [15:31:59.290] function(cond) { [15:31:59.290] is_error <- inherits(cond, "error") [15:31:59.290] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:59.290] NULL) [15:31:59.290] if (is_error) { [15:31:59.290] sessionInformation <- function() { [15:31:59.290] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:59.290] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:59.290] search = base::search(), system = base::Sys.info()) [15:31:59.290] } [15:31:59.290] ...future.conditions[[length(...future.conditions) + [15:31:59.290] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:59.290] cond$call), session = sessionInformation(), [15:31:59.290] timestamp = base::Sys.time(), signaled = 0L) [15:31:59.290] signalCondition(cond) [15:31:59.290] } [15:31:59.290] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:59.290] "immediateCondition"))) { [15:31:59.290] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:59.290] ...future.conditions[[length(...future.conditions) + [15:31:59.290] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:59.290] if (TRUE && !signal) { [15:31:59.290] muffleCondition <- function (cond, pattern = "^muffle") [15:31:59.290] { [15:31:59.290] inherits <- base::inherits [15:31:59.290] invokeRestart <- base::invokeRestart [15:31:59.290] is.null <- base::is.null [15:31:59.290] muffled <- FALSE [15:31:59.290] if (inherits(cond, "message")) { [15:31:59.290] muffled <- grepl(pattern, "muffleMessage") [15:31:59.290] if (muffled) [15:31:59.290] invokeRestart("muffleMessage") [15:31:59.290] } [15:31:59.290] else if (inherits(cond, "warning")) { [15:31:59.290] muffled <- grepl(pattern, "muffleWarning") [15:31:59.290] if (muffled) [15:31:59.290] invokeRestart("muffleWarning") [15:31:59.290] } [15:31:59.290] else if (inherits(cond, "condition")) { [15:31:59.290] if (!is.null(pattern)) { [15:31:59.290] computeRestarts <- base::computeRestarts [15:31:59.290] grepl <- base::grepl [15:31:59.290] restarts <- computeRestarts(cond) [15:31:59.290] for (restart in restarts) { [15:31:59.290] name <- restart$name [15:31:59.290] if (is.null(name)) [15:31:59.290] next [15:31:59.290] if (!grepl(pattern, name)) [15:31:59.290] next [15:31:59.290] invokeRestart(restart) [15:31:59.290] muffled <- TRUE [15:31:59.290] break [15:31:59.290] } [15:31:59.290] } [15:31:59.290] } [15:31:59.290] invisible(muffled) [15:31:59.290] } [15:31:59.290] muffleCondition(cond, pattern = "^muffle") [15:31:59.290] } [15:31:59.290] } [15:31:59.290] else { [15:31:59.290] if (TRUE) { [15:31:59.290] muffleCondition <- function (cond, pattern = "^muffle") [15:31:59.290] { [15:31:59.290] inherits <- base::inherits [15:31:59.290] invokeRestart <- base::invokeRestart [15:31:59.290] is.null <- base::is.null [15:31:59.290] muffled <- FALSE [15:31:59.290] if (inherits(cond, "message")) { [15:31:59.290] muffled <- grepl(pattern, "muffleMessage") [15:31:59.290] if (muffled) [15:31:59.290] invokeRestart("muffleMessage") [15:31:59.290] } [15:31:59.290] else if (inherits(cond, "warning")) { [15:31:59.290] muffled <- grepl(pattern, "muffleWarning") [15:31:59.290] if (muffled) [15:31:59.290] invokeRestart("muffleWarning") [15:31:59.290] } [15:31:59.290] else if (inherits(cond, "condition")) { [15:31:59.290] if (!is.null(pattern)) { [15:31:59.290] computeRestarts <- base::computeRestarts [15:31:59.290] grepl <- base::grepl [15:31:59.290] restarts <- computeRestarts(cond) [15:31:59.290] for (restart in restarts) { [15:31:59.290] name <- restart$name [15:31:59.290] if (is.null(name)) [15:31:59.290] next [15:31:59.290] if (!grepl(pattern, name)) [15:31:59.290] next [15:31:59.290] invokeRestart(restart) [15:31:59.290] muffled <- TRUE [15:31:59.290] break [15:31:59.290] } [15:31:59.290] } [15:31:59.290] } [15:31:59.290] invisible(muffled) [15:31:59.290] } [15:31:59.290] muffleCondition(cond, pattern = "^muffle") [15:31:59.290] } [15:31:59.290] } [15:31:59.290] } [15:31:59.290] })) [15:31:59.290] }, error = function(ex) { [15:31:59.290] base::structure(base::list(value = NULL, visible = NULL, [15:31:59.290] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:59.290] ...future.rng), started = ...future.startTime, [15:31:59.290] finished = Sys.time(), session_uuid = NA_character_, [15:31:59.290] version = "1.8"), class = "FutureResult") [15:31:59.290] }, finally = { [15:31:59.290] if (!identical(...future.workdir, getwd())) [15:31:59.290] setwd(...future.workdir) [15:31:59.290] { [15:31:59.290] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:59.290] ...future.oldOptions$nwarnings <- NULL [15:31:59.290] } [15:31:59.290] base::options(...future.oldOptions) [15:31:59.290] if (.Platform$OS.type == "windows") { [15:31:59.290] old_names <- names(...future.oldEnvVars) [15:31:59.290] envs <- base::Sys.getenv() [15:31:59.290] names <- names(envs) [15:31:59.290] common <- intersect(names, old_names) [15:31:59.290] added <- setdiff(names, old_names) [15:31:59.290] removed <- setdiff(old_names, names) [15:31:59.290] changed <- common[...future.oldEnvVars[common] != [15:31:59.290] envs[common]] [15:31:59.290] NAMES <- toupper(changed) [15:31:59.290] args <- list() [15:31:59.290] for (kk in seq_along(NAMES)) { [15:31:59.290] name <- changed[[kk]] [15:31:59.290] NAME <- NAMES[[kk]] [15:31:59.290] if (name != NAME && is.element(NAME, old_names)) [15:31:59.290] next [15:31:59.290] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:59.290] } [15:31:59.290] NAMES <- toupper(added) [15:31:59.290] for (kk in seq_along(NAMES)) { [15:31:59.290] name <- added[[kk]] [15:31:59.290] NAME <- NAMES[[kk]] [15:31:59.290] if (name != NAME && is.element(NAME, old_names)) [15:31:59.290] next [15:31:59.290] args[[name]] <- "" [15:31:59.290] } [15:31:59.290] NAMES <- toupper(removed) [15:31:59.290] for (kk in seq_along(NAMES)) { [15:31:59.290] name <- removed[[kk]] [15:31:59.290] NAME <- NAMES[[kk]] [15:31:59.290] if (name != NAME && is.element(NAME, old_names)) [15:31:59.290] next [15:31:59.290] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:59.290] } [15:31:59.290] if (length(args) > 0) [15:31:59.290] base::do.call(base::Sys.setenv, args = args) [15:31:59.290] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:59.290] } [15:31:59.290] else { [15:31:59.290] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:59.290] } [15:31:59.290] { [15:31:59.290] if (base::length(...future.futureOptionsAdded) > [15:31:59.290] 0L) { [15:31:59.290] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:59.290] base::names(opts) <- ...future.futureOptionsAdded [15:31:59.290] base::options(opts) [15:31:59.290] } [15:31:59.290] { [15:31:59.290] { [15:31:59.290] base::options(mc.cores = ...future.mc.cores.old) [15:31:59.290] NULL [15:31:59.290] } [15:31:59.290] options(future.plan = NULL) [15:31:59.290] if (is.na(NA_character_)) [15:31:59.290] Sys.unsetenv("R_FUTURE_PLAN") [15:31:59.290] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:59.290] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:59.290] .init = FALSE) [15:31:59.290] } [15:31:59.290] } [15:31:59.290] } [15:31:59.290] }) [15:31:59.290] if (TRUE) { [15:31:59.290] base::sink(type = "output", split = FALSE) [15:31:59.290] if (TRUE) { [15:31:59.290] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:59.290] } [15:31:59.290] else { [15:31:59.290] ...future.result["stdout"] <- base::list(NULL) [15:31:59.290] } [15:31:59.290] base::close(...future.stdout) [15:31:59.290] ...future.stdout <- NULL [15:31:59.290] } [15:31:59.290] ...future.result$conditions <- ...future.conditions [15:31:59.290] ...future.result$finished <- base::Sys.time() [15:31:59.290] ...future.result [15:31:59.290] } [15:31:59.296] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... [15:31:59.297] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... [15:31:59.297] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... DONE [15:31:59.298] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [15:31:59.298] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [15:31:59.299] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [15:31:59.300] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [15:31:59.300] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:59.301] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:59.301] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:59.302] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:59.302] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... DONE [15:31:59.303] MultisessionFuture started [15:31:59.304] - Launch lazy future ... done [15:31:59.304] run() for 'MultisessionFuture' ... done [15:31:59.304] Created future: [15:31:59.325] receiveMessageFromWorker() for ClusterFuture ... [15:31:59.326] - Validating connection of MultisessionFuture [15:31:59.326] - received message: FutureResult [15:31:59.327] - Received FutureResult [15:31:59.327] - Erased future from FutureRegistry [15:31:59.327] result() for ClusterFuture ... [15:31:59.328] - result already collected: FutureResult [15:31:59.328] result() for ClusterFuture ... done [15:31:59.328] receiveMessageFromWorker() for ClusterFuture ... done [15:31:59.304] MultisessionFuture: [15:31:59.304] Label: 'future_lapply-1' [15:31:59.304] Expression: [15:31:59.304] { [15:31:59.304] do.call(function(...) { [15:31:59.304] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:59.304] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:59.304] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:59.304] on.exit(options(oopts), add = TRUE) [15:31:59.304] } [15:31:59.304] { [15:31:59.304] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:59.304] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:59.304] ...future.FUN(...future.X_jj, ...) [15:31:59.304] }) [15:31:59.304] } [15:31:59.304] }, args = future.call.arguments) [15:31:59.304] } [15:31:59.304] Lazy evaluation: FALSE [15:31:59.304] Asynchronous evaluation: TRUE [15:31:59.304] Local evaluation: TRUE [15:31:59.304] Environment: R_GlobalEnv [15:31:59.304] Capture standard output: TRUE [15:31:59.304] Capture condition classes: 'condition' (excluding 'nothing') [15:31:59.304] Globals: 5 objects totaling 4.96 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:59.304] Packages: 1 packages ('listenv') [15:31:59.304] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:59.304] Resolved: TRUE [15:31:59.304] Value: [15:31:59.304] Conditions captured: [15:31:59.304] Early signaling: FALSE [15:31:59.304] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:59.304] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:59.329] Chunk #1 of 2 ... DONE [15:31:59.329] Chunk #2 of 2 ... [15:31:59.330] - Finding globals in 'X' for chunk #2 ... [15:31:59.330] getGlobalsAndPackages() ... [15:31:59.330] Searching for globals... [15:31:59.331] [15:31:59.332] Searching for globals ... DONE [15:31:59.332] - globals: [0] [15:31:59.332] getGlobalsAndPackages() ... DONE [15:31:59.332] + additional globals found: [n=0] [15:31:59.333] + additional namespaces needed: [n=0] [15:31:59.333] - Finding globals in 'X' for chunk #2 ... DONE [15:31:59.333] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:59.333] - seeds: [15:31:59.334] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:59.334] getGlobalsAndPackages() ... [15:31:59.334] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:59.335] Resolving globals: FALSE [15:31:59.335] Tweak future expression to call with '...' arguments ... [15:31:59.335] { [15:31:59.335] do.call(function(...) { [15:31:59.335] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:59.335] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:59.335] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:59.335] on.exit(options(oopts), add = TRUE) [15:31:59.335] } [15:31:59.335] { [15:31:59.335] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:59.335] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:59.335] ...future.FUN(...future.X_jj, ...) [15:31:59.335] }) [15:31:59.335] } [15:31:59.335] }, args = future.call.arguments) [15:31:59.335] } [15:31:59.336] Tweak future expression to call with '...' arguments ... DONE [15:31:59.337] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:59.337] - packages: [1] 'listenv' [15:31:59.338] getGlobalsAndPackages() ... DONE [15:31:59.338] run() for 'Future' ... [15:31:59.339] - state: 'created' [15:31:59.339] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:59.361] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:59.361] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:59.362] - Field: 'node' [15:31:59.362] - Field: 'label' [15:31:59.362] - Field: 'local' [15:31:59.363] - Field: 'owner' [15:31:59.363] - Field: 'envir' [15:31:59.363] - Field: 'workers' [15:31:59.363] - Field: 'packages' [15:31:59.364] - Field: 'gc' [15:31:59.364] - Field: 'conditions' [15:31:59.364] - Field: 'persistent' [15:31:59.365] - Field: 'expr' [15:31:59.365] - Field: 'uuid' [15:31:59.365] - Field: 'seed' [15:31:59.366] - Field: 'version' [15:31:59.366] - Field: 'result' [15:31:59.366] - Field: 'asynchronous' [15:31:59.367] - Field: 'calls' [15:31:59.367] - Field: 'globals' [15:31:59.367] - Field: 'stdout' [15:31:59.367] - Field: 'earlySignal' [15:31:59.368] - Field: 'lazy' [15:31:59.368] - Field: 'state' [15:31:59.368] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:59.369] - Launch lazy future ... [15:31:59.369] Packages needed by the future expression (n = 1): 'listenv' [15:31:59.370] Packages needed by future strategies (n = 0): [15:31:59.371] { [15:31:59.371] { [15:31:59.371] { [15:31:59.371] ...future.startTime <- base::Sys.time() [15:31:59.371] { [15:31:59.371] { [15:31:59.371] { [15:31:59.371] { [15:31:59.371] { [15:31:59.371] base::local({ [15:31:59.371] has_future <- base::requireNamespace("future", [15:31:59.371] quietly = TRUE) [15:31:59.371] if (has_future) { [15:31:59.371] ns <- base::getNamespace("future") [15:31:59.371] version <- ns[[".package"]][["version"]] [15:31:59.371] if (is.null(version)) [15:31:59.371] version <- utils::packageVersion("future") [15:31:59.371] } [15:31:59.371] else { [15:31:59.371] version <- NULL [15:31:59.371] } [15:31:59.371] if (!has_future || version < "1.8.0") { [15:31:59.371] info <- base::c(r_version = base::gsub("R version ", [15:31:59.371] "", base::R.version$version.string), [15:31:59.371] platform = base::sprintf("%s (%s-bit)", [15:31:59.371] base::R.version$platform, 8 * [15:31:59.371] base::.Machine$sizeof.pointer), [15:31:59.371] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:59.371] "release", "version")], collapse = " "), [15:31:59.371] hostname = base::Sys.info()[["nodename"]]) [15:31:59.371] info <- base::sprintf("%s: %s", base::names(info), [15:31:59.371] info) [15:31:59.371] info <- base::paste(info, collapse = "; ") [15:31:59.371] if (!has_future) { [15:31:59.371] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:59.371] info) [15:31:59.371] } [15:31:59.371] else { [15:31:59.371] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:59.371] info, version) [15:31:59.371] } [15:31:59.371] base::stop(msg) [15:31:59.371] } [15:31:59.371] }) [15:31:59.371] } [15:31:59.371] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:59.371] base::options(mc.cores = 1L) [15:31:59.371] } [15:31:59.371] base::local({ [15:31:59.371] for (pkg in "listenv") { [15:31:59.371] base::loadNamespace(pkg) [15:31:59.371] base::library(pkg, character.only = TRUE) [15:31:59.371] } [15:31:59.371] }) [15:31:59.371] } [15:31:59.371] ...future.strategy.old <- future::plan("list") [15:31:59.371] options(future.plan = NULL) [15:31:59.371] Sys.unsetenv("R_FUTURE_PLAN") [15:31:59.371] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:59.371] } [15:31:59.371] ...future.workdir <- getwd() [15:31:59.371] } [15:31:59.371] ...future.oldOptions <- base::as.list(base::.Options) [15:31:59.371] ...future.oldEnvVars <- base::Sys.getenv() [15:31:59.371] } [15:31:59.371] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:59.371] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:59.371] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:59.371] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:59.371] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:59.371] future.stdout.windows.reencode = NULL, width = 80L) [15:31:59.371] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:59.371] base::names(...future.oldOptions)) [15:31:59.371] } [15:31:59.371] if (FALSE) { [15:31:59.371] } [15:31:59.371] else { [15:31:59.371] if (TRUE) { [15:31:59.371] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:59.371] open = "w") [15:31:59.371] } [15:31:59.371] else { [15:31:59.371] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:59.371] windows = "NUL", "/dev/null"), open = "w") [15:31:59.371] } [15:31:59.371] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:59.371] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:59.371] base::sink(type = "output", split = FALSE) [15:31:59.371] base::close(...future.stdout) [15:31:59.371] }, add = TRUE) [15:31:59.371] } [15:31:59.371] ...future.frame <- base::sys.nframe() [15:31:59.371] ...future.conditions <- base::list() [15:31:59.371] ...future.rng <- base::globalenv()$.Random.seed [15:31:59.371] if (FALSE) { [15:31:59.371] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:59.371] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:59.371] } [15:31:59.371] ...future.result <- base::tryCatch({ [15:31:59.371] base::withCallingHandlers({ [15:31:59.371] ...future.value <- base::withVisible(base::local({ [15:31:59.371] ...future.makeSendCondition <- base::local({ [15:31:59.371] sendCondition <- NULL [15:31:59.371] function(frame = 1L) { [15:31:59.371] if (is.function(sendCondition)) [15:31:59.371] return(sendCondition) [15:31:59.371] ns <- getNamespace("parallel") [15:31:59.371] if (exists("sendData", mode = "function", [15:31:59.371] envir = ns)) { [15:31:59.371] parallel_sendData <- get("sendData", mode = "function", [15:31:59.371] envir = ns) [15:31:59.371] envir <- sys.frame(frame) [15:31:59.371] master <- NULL [15:31:59.371] while (!identical(envir, .GlobalEnv) && [15:31:59.371] !identical(envir, emptyenv())) { [15:31:59.371] if (exists("master", mode = "list", envir = envir, [15:31:59.371] inherits = FALSE)) { [15:31:59.371] master <- get("master", mode = "list", [15:31:59.371] envir = envir, inherits = FALSE) [15:31:59.371] if (inherits(master, c("SOCKnode", [15:31:59.371] "SOCK0node"))) { [15:31:59.371] sendCondition <<- function(cond) { [15:31:59.371] data <- list(type = "VALUE", value = cond, [15:31:59.371] success = TRUE) [15:31:59.371] parallel_sendData(master, data) [15:31:59.371] } [15:31:59.371] return(sendCondition) [15:31:59.371] } [15:31:59.371] } [15:31:59.371] frame <- frame + 1L [15:31:59.371] envir <- sys.frame(frame) [15:31:59.371] } [15:31:59.371] } [15:31:59.371] sendCondition <<- function(cond) NULL [15:31:59.371] } [15:31:59.371] }) [15:31:59.371] withCallingHandlers({ [15:31:59.371] { [15:31:59.371] do.call(function(...) { [15:31:59.371] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:59.371] if (!identical(...future.globals.maxSize.org, [15:31:59.371] ...future.globals.maxSize)) { [15:31:59.371] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:59.371] on.exit(options(oopts), add = TRUE) [15:31:59.371] } [15:31:59.371] { [15:31:59.371] lapply(seq_along(...future.elements_ii), [15:31:59.371] FUN = function(jj) { [15:31:59.371] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:59.371] ...future.FUN(...future.X_jj, ...) [15:31:59.371] }) [15:31:59.371] } [15:31:59.371] }, args = future.call.arguments) [15:31:59.371] } [15:31:59.371] }, immediateCondition = function(cond) { [15:31:59.371] sendCondition <- ...future.makeSendCondition() [15:31:59.371] sendCondition(cond) [15:31:59.371] muffleCondition <- function (cond, pattern = "^muffle") [15:31:59.371] { [15:31:59.371] inherits <- base::inherits [15:31:59.371] invokeRestart <- base::invokeRestart [15:31:59.371] is.null <- base::is.null [15:31:59.371] muffled <- FALSE [15:31:59.371] if (inherits(cond, "message")) { [15:31:59.371] muffled <- grepl(pattern, "muffleMessage") [15:31:59.371] if (muffled) [15:31:59.371] invokeRestart("muffleMessage") [15:31:59.371] } [15:31:59.371] else if (inherits(cond, "warning")) { [15:31:59.371] muffled <- grepl(pattern, "muffleWarning") [15:31:59.371] if (muffled) [15:31:59.371] invokeRestart("muffleWarning") [15:31:59.371] } [15:31:59.371] else if (inherits(cond, "condition")) { [15:31:59.371] if (!is.null(pattern)) { [15:31:59.371] computeRestarts <- base::computeRestarts [15:31:59.371] grepl <- base::grepl [15:31:59.371] restarts <- computeRestarts(cond) [15:31:59.371] for (restart in restarts) { [15:31:59.371] name <- restart$name [15:31:59.371] if (is.null(name)) [15:31:59.371] next [15:31:59.371] if (!grepl(pattern, name)) [15:31:59.371] next [15:31:59.371] invokeRestart(restart) [15:31:59.371] muffled <- TRUE [15:31:59.371] break [15:31:59.371] } [15:31:59.371] } [15:31:59.371] } [15:31:59.371] invisible(muffled) [15:31:59.371] } [15:31:59.371] muffleCondition(cond) [15:31:59.371] }) [15:31:59.371] })) [15:31:59.371] future::FutureResult(value = ...future.value$value, [15:31:59.371] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:59.371] ...future.rng), globalenv = if (FALSE) [15:31:59.371] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:59.371] ...future.globalenv.names)) [15:31:59.371] else NULL, started = ...future.startTime, version = "1.8") [15:31:59.371] }, condition = base::local({ [15:31:59.371] c <- base::c [15:31:59.371] inherits <- base::inherits [15:31:59.371] invokeRestart <- base::invokeRestart [15:31:59.371] length <- base::length [15:31:59.371] list <- base::list [15:31:59.371] seq.int <- base::seq.int [15:31:59.371] signalCondition <- base::signalCondition [15:31:59.371] sys.calls <- base::sys.calls [15:31:59.371] `[[` <- base::`[[` [15:31:59.371] `+` <- base::`+` [15:31:59.371] `<<-` <- base::`<<-` [15:31:59.371] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:59.371] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:59.371] 3L)] [15:31:59.371] } [15:31:59.371] function(cond) { [15:31:59.371] is_error <- inherits(cond, "error") [15:31:59.371] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:59.371] NULL) [15:31:59.371] if (is_error) { [15:31:59.371] sessionInformation <- function() { [15:31:59.371] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:59.371] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:59.371] search = base::search(), system = base::Sys.info()) [15:31:59.371] } [15:31:59.371] ...future.conditions[[length(...future.conditions) + [15:31:59.371] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:59.371] cond$call), session = sessionInformation(), [15:31:59.371] timestamp = base::Sys.time(), signaled = 0L) [15:31:59.371] signalCondition(cond) [15:31:59.371] } [15:31:59.371] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:59.371] "immediateCondition"))) { [15:31:59.371] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:59.371] ...future.conditions[[length(...future.conditions) + [15:31:59.371] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:59.371] if (TRUE && !signal) { [15:31:59.371] muffleCondition <- function (cond, pattern = "^muffle") [15:31:59.371] { [15:31:59.371] inherits <- base::inherits [15:31:59.371] invokeRestart <- base::invokeRestart [15:31:59.371] is.null <- base::is.null [15:31:59.371] muffled <- FALSE [15:31:59.371] if (inherits(cond, "message")) { [15:31:59.371] muffled <- grepl(pattern, "muffleMessage") [15:31:59.371] if (muffled) [15:31:59.371] invokeRestart("muffleMessage") [15:31:59.371] } [15:31:59.371] else if (inherits(cond, "warning")) { [15:31:59.371] muffled <- grepl(pattern, "muffleWarning") [15:31:59.371] if (muffled) [15:31:59.371] invokeRestart("muffleWarning") [15:31:59.371] } [15:31:59.371] else if (inherits(cond, "condition")) { [15:31:59.371] if (!is.null(pattern)) { [15:31:59.371] computeRestarts <- base::computeRestarts [15:31:59.371] grepl <- base::grepl [15:31:59.371] restarts <- computeRestarts(cond) [15:31:59.371] for (restart in restarts) { [15:31:59.371] name <- restart$name [15:31:59.371] if (is.null(name)) [15:31:59.371] next [15:31:59.371] if (!grepl(pattern, name)) [15:31:59.371] next [15:31:59.371] invokeRestart(restart) [15:31:59.371] muffled <- TRUE [15:31:59.371] break [15:31:59.371] } [15:31:59.371] } [15:31:59.371] } [15:31:59.371] invisible(muffled) [15:31:59.371] } [15:31:59.371] muffleCondition(cond, pattern = "^muffle") [15:31:59.371] } [15:31:59.371] } [15:31:59.371] else { [15:31:59.371] if (TRUE) { [15:31:59.371] muffleCondition <- function (cond, pattern = "^muffle") [15:31:59.371] { [15:31:59.371] inherits <- base::inherits [15:31:59.371] invokeRestart <- base::invokeRestart [15:31:59.371] is.null <- base::is.null [15:31:59.371] muffled <- FALSE [15:31:59.371] if (inherits(cond, "message")) { [15:31:59.371] muffled <- grepl(pattern, "muffleMessage") [15:31:59.371] if (muffled) [15:31:59.371] invokeRestart("muffleMessage") [15:31:59.371] } [15:31:59.371] else if (inherits(cond, "warning")) { [15:31:59.371] muffled <- grepl(pattern, "muffleWarning") [15:31:59.371] if (muffled) [15:31:59.371] invokeRestart("muffleWarning") [15:31:59.371] } [15:31:59.371] else if (inherits(cond, "condition")) { [15:31:59.371] if (!is.null(pattern)) { [15:31:59.371] computeRestarts <- base::computeRestarts [15:31:59.371] grepl <- base::grepl [15:31:59.371] restarts <- computeRestarts(cond) [15:31:59.371] for (restart in restarts) { [15:31:59.371] name <- restart$name [15:31:59.371] if (is.null(name)) [15:31:59.371] next [15:31:59.371] if (!grepl(pattern, name)) [15:31:59.371] next [15:31:59.371] invokeRestart(restart) [15:31:59.371] muffled <- TRUE [15:31:59.371] break [15:31:59.371] } [15:31:59.371] } [15:31:59.371] } [15:31:59.371] invisible(muffled) [15:31:59.371] } [15:31:59.371] muffleCondition(cond, pattern = "^muffle") [15:31:59.371] } [15:31:59.371] } [15:31:59.371] } [15:31:59.371] })) [15:31:59.371] }, error = function(ex) { [15:31:59.371] base::structure(base::list(value = NULL, visible = NULL, [15:31:59.371] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:59.371] ...future.rng), started = ...future.startTime, [15:31:59.371] finished = Sys.time(), session_uuid = NA_character_, [15:31:59.371] version = "1.8"), class = "FutureResult") [15:31:59.371] }, finally = { [15:31:59.371] if (!identical(...future.workdir, getwd())) [15:31:59.371] setwd(...future.workdir) [15:31:59.371] { [15:31:59.371] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:59.371] ...future.oldOptions$nwarnings <- NULL [15:31:59.371] } [15:31:59.371] base::options(...future.oldOptions) [15:31:59.371] if (.Platform$OS.type == "windows") { [15:31:59.371] old_names <- names(...future.oldEnvVars) [15:31:59.371] envs <- base::Sys.getenv() [15:31:59.371] names <- names(envs) [15:31:59.371] common <- intersect(names, old_names) [15:31:59.371] added <- setdiff(names, old_names) [15:31:59.371] removed <- setdiff(old_names, names) [15:31:59.371] changed <- common[...future.oldEnvVars[common] != [15:31:59.371] envs[common]] [15:31:59.371] NAMES <- toupper(changed) [15:31:59.371] args <- list() [15:31:59.371] for (kk in seq_along(NAMES)) { [15:31:59.371] name <- changed[[kk]] [15:31:59.371] NAME <- NAMES[[kk]] [15:31:59.371] if (name != NAME && is.element(NAME, old_names)) [15:31:59.371] next [15:31:59.371] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:59.371] } [15:31:59.371] NAMES <- toupper(added) [15:31:59.371] for (kk in seq_along(NAMES)) { [15:31:59.371] name <- added[[kk]] [15:31:59.371] NAME <- NAMES[[kk]] [15:31:59.371] if (name != NAME && is.element(NAME, old_names)) [15:31:59.371] next [15:31:59.371] args[[name]] <- "" [15:31:59.371] } [15:31:59.371] NAMES <- toupper(removed) [15:31:59.371] for (kk in seq_along(NAMES)) { [15:31:59.371] name <- removed[[kk]] [15:31:59.371] NAME <- NAMES[[kk]] [15:31:59.371] if (name != NAME && is.element(NAME, old_names)) [15:31:59.371] next [15:31:59.371] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:59.371] } [15:31:59.371] if (length(args) > 0) [15:31:59.371] base::do.call(base::Sys.setenv, args = args) [15:31:59.371] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:59.371] } [15:31:59.371] else { [15:31:59.371] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:59.371] } [15:31:59.371] { [15:31:59.371] if (base::length(...future.futureOptionsAdded) > [15:31:59.371] 0L) { [15:31:59.371] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:59.371] base::names(opts) <- ...future.futureOptionsAdded [15:31:59.371] base::options(opts) [15:31:59.371] } [15:31:59.371] { [15:31:59.371] { [15:31:59.371] base::options(mc.cores = ...future.mc.cores.old) [15:31:59.371] NULL [15:31:59.371] } [15:31:59.371] options(future.plan = NULL) [15:31:59.371] if (is.na(NA_character_)) [15:31:59.371] Sys.unsetenv("R_FUTURE_PLAN") [15:31:59.371] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:59.371] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:59.371] .init = FALSE) [15:31:59.371] } [15:31:59.371] } [15:31:59.371] } [15:31:59.371] }) [15:31:59.371] if (TRUE) { [15:31:59.371] base::sink(type = "output", split = FALSE) [15:31:59.371] if (TRUE) { [15:31:59.371] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:59.371] } [15:31:59.371] else { [15:31:59.371] ...future.result["stdout"] <- base::list(NULL) [15:31:59.371] } [15:31:59.371] base::close(...future.stdout) [15:31:59.371] ...future.stdout <- NULL [15:31:59.371] } [15:31:59.371] ...future.result$conditions <- ...future.conditions [15:31:59.371] ...future.result$finished <- base::Sys.time() [15:31:59.371] ...future.result [15:31:59.371] } [15:31:59.380] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... [15:31:59.380] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... [15:31:59.381] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... DONE [15:31:59.382] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [15:31:59.383] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [15:31:59.384] Exporting '...future.elements_ii' (12.94 KiB) to cluster node #1 ... [15:31:59.385] Exporting '...future.elements_ii' (12.94 KiB) to cluster node #1 ... DONE [15:31:59.385] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:59.386] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:59.387] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:59.388] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:59.388] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... DONE [15:31:59.389] MultisessionFuture started [15:31:59.389] - Launch lazy future ... done [15:31:59.390] run() for 'MultisessionFuture' ... done [15:31:59.390] Created future: [15:31:59.411] receiveMessageFromWorker() for ClusterFuture ... [15:31:59.411] - Validating connection of MultisessionFuture [15:31:59.412] - received message: FutureResult [15:31:59.412] - Received FutureResult [15:31:59.413] - Erased future from FutureRegistry [15:31:59.413] result() for ClusterFuture ... [15:31:59.413] - result already collected: FutureResult [15:31:59.414] result() for ClusterFuture ... done [15:31:59.414] receiveMessageFromWorker() for ClusterFuture ... done [15:31:59.390] MultisessionFuture: [15:31:59.390] Label: 'future_lapply-2' [15:31:59.390] Expression: [15:31:59.390] { [15:31:59.390] do.call(function(...) { [15:31:59.390] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:59.390] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:59.390] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:59.390] on.exit(options(oopts), add = TRUE) [15:31:59.390] } [15:31:59.390] { [15:31:59.390] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:59.390] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:59.390] ...future.FUN(...future.X_jj, ...) [15:31:59.390] }) [15:31:59.390] } [15:31:59.390] }, args = future.call.arguments) [15:31:59.390] } [15:31:59.390] Lazy evaluation: FALSE [15:31:59.390] Asynchronous evaluation: TRUE [15:31:59.390] Local evaluation: TRUE [15:31:59.390] Environment: R_GlobalEnv [15:31:59.390] Capture standard output: TRUE [15:31:59.390] Capture condition classes: 'condition' (excluding 'nothing') [15:31:59.390] Globals: 5 objects totaling 17.79 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 12.94 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:59.390] Packages: 1 packages ('listenv') [15:31:59.390] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:59.390] Resolved: TRUE [15:31:59.390] Value: [15:31:59.390] Conditions captured: [15:31:59.390] Early signaling: FALSE [15:31:59.390] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:59.390] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:59.415] Chunk #2 of 2 ... DONE [15:31:59.415] Launching 2 futures (chunks) ... DONE [15:31:59.415] Resolving 2 futures (chunks) ... [15:31:59.415] resolve() on list ... [15:31:59.415] recursive: 0 [15:31:59.416] length: 2 [15:31:59.416] [15:31:59.416] Future #1 [15:31:59.417] result() for ClusterFuture ... [15:31:59.417] - result already collected: FutureResult [15:31:59.417] result() for ClusterFuture ... done [15:31:59.417] result() for ClusterFuture ... [15:31:59.418] - result already collected: FutureResult [15:31:59.418] result() for ClusterFuture ... done [15:31:59.418] signalConditionsASAP(MultisessionFuture, pos=1) ... [15:31:59.418] - nx: 2 [15:31:59.418] - relay: TRUE [15:31:59.418] - stdout: TRUE [15:31:59.419] - signal: TRUE [15:31:59.419] - resignal: FALSE [15:31:59.419] - force: TRUE [15:31:59.419] - relayed: [n=2] FALSE, FALSE [15:31:59.419] - queued futures: [n=2] FALSE, FALSE [15:31:59.419] - until=1 [15:31:59.420] - relaying element #1 [15:31:59.420] result() for ClusterFuture ... [15:31:59.420] - result already collected: FutureResult [15:31:59.420] result() for ClusterFuture ... done [15:31:59.420] result() for ClusterFuture ... [15:31:59.421] - result already collected: FutureResult [15:31:59.421] result() for ClusterFuture ... done [15:31:59.421] result() for ClusterFuture ... [15:31:59.421] - result already collected: FutureResult [15:31:59.422] result() for ClusterFuture ... done [15:31:59.422] result() for ClusterFuture ... [15:31:59.422] - result already collected: FutureResult [15:31:59.422] result() for ClusterFuture ... done [15:31:59.423] - relayed: [n=2] TRUE, FALSE [15:31:59.428] - queued futures: [n=2] TRUE, FALSE [15:31:59.429] signalConditionsASAP(MultisessionFuture, pos=1) ... done [15:31:59.429] length: 1 (resolved future 1) [15:31:59.429] Future #2 [15:31:59.430] result() for ClusterFuture ... [15:31:59.430] - result already collected: FutureResult [15:31:59.430] result() for ClusterFuture ... done [15:31:59.430] result() for ClusterFuture ... [15:31:59.431] - result already collected: FutureResult [15:31:59.431] result() for ClusterFuture ... done [15:31:59.431] signalConditionsASAP(MultisessionFuture, pos=2) ... [15:31:59.431] - nx: 2 [15:31:59.431] - relay: TRUE [15:31:59.432] - stdout: TRUE [15:31:59.432] - signal: TRUE [15:31:59.432] - resignal: FALSE [15:31:59.432] - force: TRUE [15:31:59.433] - relayed: [n=2] TRUE, FALSE [15:31:59.433] - queued futures: [n=2] TRUE, FALSE [15:31:59.433] - until=2 [15:31:59.433] - relaying element #2 [15:31:59.434] result() for ClusterFuture ... [15:31:59.434] - result already collected: FutureResult [15:31:59.434] result() for ClusterFuture ... done [15:31:59.434] result() for ClusterFuture ... [15:31:59.434] - result already collected: FutureResult [15:31:59.435] result() for ClusterFuture ... done [15:31:59.435] result() for ClusterFuture ... [15:31:59.435] - result already collected: FutureResult [15:31:59.435] result() for ClusterFuture ... done [15:31:59.436] result() for ClusterFuture ... [15:31:59.436] - result already collected: FutureResult [15:31:59.436] result() for ClusterFuture ... done [15:31:59.436] - relayed: [n=2] TRUE, TRUE [15:31:59.437] - queued futures: [n=2] TRUE, TRUE [15:31:59.437] signalConditionsASAP(MultisessionFuture, pos=2) ... done [15:31:59.437] length: 0 (resolved future 2) [15:31:59.437] Relaying remaining futures [15:31:59.438] signalConditionsASAP(NULL, pos=0) ... [15:31:59.438] - nx: 2 [15:31:59.438] - relay: TRUE [15:31:59.438] - stdout: TRUE [15:31:59.438] - signal: TRUE [15:31:59.439] - resignal: FALSE [15:31:59.439] - force: TRUE [15:31:59.439] - relayed: [n=2] TRUE, TRUE [15:31:59.439] - queued futures: [n=2] TRUE, TRUE - flush all [15:31:59.440] - relayed: [n=2] TRUE, TRUE [15:31:59.440] - queued futures: [n=2] TRUE, TRUE [15:31:59.440] signalConditionsASAP(NULL, pos=0) ... done [15:31:59.440] resolve() on list ... DONE [15:31:59.441] result() for ClusterFuture ... [15:31:59.441] - result already collected: FutureResult [15:31:59.441] result() for ClusterFuture ... done [15:31:59.441] result() for ClusterFuture ... [15:31:59.442] - result already collected: FutureResult [15:31:59.442] result() for ClusterFuture ... done [15:31:59.442] result() for ClusterFuture ... [15:31:59.442] - result already collected: FutureResult [15:31:59.443] result() for ClusterFuture ... done [15:31:59.443] result() for ClusterFuture ... [15:31:59.443] - result already collected: FutureResult [15:31:59.443] result() for ClusterFuture ... done [15:31:59.444] - Number of value chunks collected: 2 [15:31:59.444] Resolving 2 futures (chunks) ... DONE [15:31:59.444] Reducing values from 2 chunks ... [15:31:59.444] - Number of values collected after concatenation: 2 [15:31:59.445] - Number of values expected: 2 [15:31:59.445] Reverse index remapping (attribute 'ordering'): [n = 2] 1, 2 [15:31:59.445] Reducing values from 2 chunks ... DONE [15:31:59.445] 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, ...) ... [15:31:59.449] future_lapply() ... [15:31:59.453] Number of chunks: 2 [15:31:59.454] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [15:31:59.454] getGlobalsAndPackagesXApply() ... [15:31:59.454] - future.globals: TRUE [15:31:59.454] getGlobalsAndPackages() ... [15:31:59.455] Searching for globals... [15:31:59.457] - globals found: [2] 'FUN', '.Internal' [15:31:59.457] Searching for globals ... DONE [15:31:59.457] Resolving globals: FALSE [15:31:59.458] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:59.459] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:59.459] - globals: [1] 'FUN' [15:31:59.459] [15:31:59.460] getGlobalsAndPackages() ... DONE [15:31:59.460] - globals found/used: [n=1] 'FUN' [15:31:59.460] - needed namespaces: [n=0] [15:31:59.460] Finding globals ... DONE [15:31:59.461] - use_args: TRUE [15:31:59.461] - Getting '...' globals ... [15:31:59.461] resolve() on list ... [15:31:59.462] recursive: 0 [15:31:59.462] length: 1 [15:31:59.462] elements: '...' [15:31:59.462] length: 0 (resolved future 1) [15:31:59.463] resolve() on list ... DONE [15:31:59.463] - '...' content: [n=1] 'length' [15:31:59.463] List of 1 [15:31:59.463] $ ...:List of 1 [15:31:59.463] ..$ length: int 2 [15:31:59.463] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:59.463] - attr(*, "where")=List of 1 [15:31:59.463] ..$ ...: [15:31:59.463] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:59.463] - attr(*, "resolved")= logi TRUE [15:31:59.463] - attr(*, "total_size")= num NA [15:31:59.469] - Getting '...' globals ... DONE [15:31:59.469] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:59.469] List of 2 [15:31:59.469] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:59.469] $ ... :List of 1 [15:31:59.469] ..$ length: int 2 [15:31:59.469] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:59.469] - attr(*, "where")=List of 2 [15:31:59.469] ..$ ...future.FUN: [15:31:59.469] ..$ ... : [15:31:59.469] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:59.469] - attr(*, "resolved")= logi FALSE [15:31:59.469] - attr(*, "total_size")= num 2240 [15:31:59.475] Packages to be attached in all futures: [n=0] [15:31:59.476] getGlobalsAndPackagesXApply() ... DONE [15:31:59.476] Number of futures (= number of chunks): 2 [15:31:59.477] Launching 2 futures (chunks) ... [15:31:59.477] Chunk #1 of 2 ... [15:31:59.477] - Finding globals in 'X' for chunk #1 ... [15:31:59.478] getGlobalsAndPackages() ... [15:31:59.478] Searching for globals... [15:31:59.479] [15:31:59.479] Searching for globals ... DONE [15:31:59.479] - globals: [0] [15:31:59.480] getGlobalsAndPackages() ... DONE [15:31:59.480] + additional globals found: [n=0] [15:31:59.480] + additional namespaces needed: [n=0] [15:31:59.481] - Finding globals in 'X' for chunk #1 ... DONE [15:31:59.481] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:59.482] - seeds: [15:31:59.482] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:59.482] getGlobalsAndPackages() ... [15:31:59.483] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:59.483] Resolving globals: FALSE [15:31:59.484] Tweak future expression to call with '...' arguments ... [15:31:59.484] { [15:31:59.484] do.call(function(...) { [15:31:59.484] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:59.484] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:59.484] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:59.484] on.exit(options(oopts), add = TRUE) [15:31:59.484] } [15:31:59.484] { [15:31:59.484] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:59.484] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:59.484] ...future.FUN(...future.X_jj, ...) [15:31:59.484] }) [15:31:59.484] } [15:31:59.484] }, args = future.call.arguments) [15:31:59.484] } [15:31:59.485] Tweak future expression to call with '...' arguments ... DONE [15:31:59.486] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:59.487] [15:31:59.487] getGlobalsAndPackages() ... DONE [15:31:59.488] run() for 'Future' ... [15:31:59.488] - state: 'created' [15:31:59.489] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:59.513] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:59.513] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:59.514] - Field: 'node' [15:31:59.514] - Field: 'label' [15:31:59.514] - Field: 'local' [15:31:59.514] - Field: 'owner' [15:31:59.515] - Field: 'envir' [15:31:59.515] - Field: 'workers' [15:31:59.515] - Field: 'packages' [15:31:59.515] - Field: 'gc' [15:31:59.516] - Field: 'conditions' [15:31:59.516] - Field: 'persistent' [15:31:59.516] - Field: 'expr' [15:31:59.516] - Field: 'uuid' [15:31:59.517] - Field: 'seed' [15:31:59.517] - Field: 'version' [15:31:59.517] - Field: 'result' [15:31:59.518] - Field: 'asynchronous' [15:31:59.518] - Field: 'calls' [15:31:59.518] - Field: 'globals' [15:31:59.519] - Field: 'stdout' [15:31:59.519] - Field: 'earlySignal' [15:31:59.519] - Field: 'lazy' [15:31:59.519] - Field: 'state' [15:31:59.520] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:59.520] - Launch lazy future ... [15:31:59.521] Packages needed by the future expression (n = 0): [15:31:59.521] Packages needed by future strategies (n = 0): [15:31:59.522] { [15:31:59.522] { [15:31:59.522] { [15:31:59.522] ...future.startTime <- base::Sys.time() [15:31:59.522] { [15:31:59.522] { [15:31:59.522] { [15:31:59.522] { [15:31:59.522] base::local({ [15:31:59.522] has_future <- base::requireNamespace("future", [15:31:59.522] quietly = TRUE) [15:31:59.522] if (has_future) { [15:31:59.522] ns <- base::getNamespace("future") [15:31:59.522] version <- ns[[".package"]][["version"]] [15:31:59.522] if (is.null(version)) [15:31:59.522] version <- utils::packageVersion("future") [15:31:59.522] } [15:31:59.522] else { [15:31:59.522] version <- NULL [15:31:59.522] } [15:31:59.522] if (!has_future || version < "1.8.0") { [15:31:59.522] info <- base::c(r_version = base::gsub("R version ", [15:31:59.522] "", base::R.version$version.string), [15:31:59.522] platform = base::sprintf("%s (%s-bit)", [15:31:59.522] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:59.522] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:59.522] "release", "version")], collapse = " "), [15:31:59.522] hostname = base::Sys.info()[["nodename"]]) [15:31:59.522] info <- base::sprintf("%s: %s", base::names(info), [15:31:59.522] info) [15:31:59.522] info <- base::paste(info, collapse = "; ") [15:31:59.522] if (!has_future) { [15:31:59.522] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:59.522] info) [15:31:59.522] } [15:31:59.522] else { [15:31:59.522] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:59.522] info, version) [15:31:59.522] } [15:31:59.522] base::stop(msg) [15:31:59.522] } [15:31:59.522] }) [15:31:59.522] } [15:31:59.522] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:59.522] base::options(mc.cores = 1L) [15:31:59.522] } [15:31:59.522] ...future.strategy.old <- future::plan("list") [15:31:59.522] options(future.plan = NULL) [15:31:59.522] Sys.unsetenv("R_FUTURE_PLAN") [15:31:59.522] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:59.522] } [15:31:59.522] ...future.workdir <- getwd() [15:31:59.522] } [15:31:59.522] ...future.oldOptions <- base::as.list(base::.Options) [15:31:59.522] ...future.oldEnvVars <- base::Sys.getenv() [15:31:59.522] } [15:31:59.522] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:59.522] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:59.522] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:59.522] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:59.522] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:59.522] future.stdout.windows.reencode = NULL, width = 80L) [15:31:59.522] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:59.522] base::names(...future.oldOptions)) [15:31:59.522] } [15:31:59.522] if (FALSE) { [15:31:59.522] } [15:31:59.522] else { [15:31:59.522] if (TRUE) { [15:31:59.522] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:59.522] open = "w") [15:31:59.522] } [15:31:59.522] else { [15:31:59.522] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:59.522] windows = "NUL", "/dev/null"), open = "w") [15:31:59.522] } [15:31:59.522] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:59.522] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:59.522] base::sink(type = "output", split = FALSE) [15:31:59.522] base::close(...future.stdout) [15:31:59.522] }, add = TRUE) [15:31:59.522] } [15:31:59.522] ...future.frame <- base::sys.nframe() [15:31:59.522] ...future.conditions <- base::list() [15:31:59.522] ...future.rng <- base::globalenv()$.Random.seed [15:31:59.522] if (FALSE) { [15:31:59.522] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:59.522] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:59.522] } [15:31:59.522] ...future.result <- base::tryCatch({ [15:31:59.522] base::withCallingHandlers({ [15:31:59.522] ...future.value <- base::withVisible(base::local({ [15:31:59.522] ...future.makeSendCondition <- base::local({ [15:31:59.522] sendCondition <- NULL [15:31:59.522] function(frame = 1L) { [15:31:59.522] if (is.function(sendCondition)) [15:31:59.522] return(sendCondition) [15:31:59.522] ns <- getNamespace("parallel") [15:31:59.522] if (exists("sendData", mode = "function", [15:31:59.522] envir = ns)) { [15:31:59.522] parallel_sendData <- get("sendData", mode = "function", [15:31:59.522] envir = ns) [15:31:59.522] envir <- sys.frame(frame) [15:31:59.522] master <- NULL [15:31:59.522] while (!identical(envir, .GlobalEnv) && [15:31:59.522] !identical(envir, emptyenv())) { [15:31:59.522] if (exists("master", mode = "list", envir = envir, [15:31:59.522] inherits = FALSE)) { [15:31:59.522] master <- get("master", mode = "list", [15:31:59.522] envir = envir, inherits = FALSE) [15:31:59.522] if (inherits(master, c("SOCKnode", [15:31:59.522] "SOCK0node"))) { [15:31:59.522] sendCondition <<- function(cond) { [15:31:59.522] data <- list(type = "VALUE", value = cond, [15:31:59.522] success = TRUE) [15:31:59.522] parallel_sendData(master, data) [15:31:59.522] } [15:31:59.522] return(sendCondition) [15:31:59.522] } [15:31:59.522] } [15:31:59.522] frame <- frame + 1L [15:31:59.522] envir <- sys.frame(frame) [15:31:59.522] } [15:31:59.522] } [15:31:59.522] sendCondition <<- function(cond) NULL [15:31:59.522] } [15:31:59.522] }) [15:31:59.522] withCallingHandlers({ [15:31:59.522] { [15:31:59.522] do.call(function(...) { [15:31:59.522] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:59.522] if (!identical(...future.globals.maxSize.org, [15:31:59.522] ...future.globals.maxSize)) { [15:31:59.522] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:59.522] on.exit(options(oopts), add = TRUE) [15:31:59.522] } [15:31:59.522] { [15:31:59.522] lapply(seq_along(...future.elements_ii), [15:31:59.522] FUN = function(jj) { [15:31:59.522] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:59.522] ...future.FUN(...future.X_jj, ...) [15:31:59.522] }) [15:31:59.522] } [15:31:59.522] }, args = future.call.arguments) [15:31:59.522] } [15:31:59.522] }, immediateCondition = function(cond) { [15:31:59.522] sendCondition <- ...future.makeSendCondition() [15:31:59.522] sendCondition(cond) [15:31:59.522] muffleCondition <- function (cond, pattern = "^muffle") [15:31:59.522] { [15:31:59.522] inherits <- base::inherits [15:31:59.522] invokeRestart <- base::invokeRestart [15:31:59.522] is.null <- base::is.null [15:31:59.522] muffled <- FALSE [15:31:59.522] if (inherits(cond, "message")) { [15:31:59.522] muffled <- grepl(pattern, "muffleMessage") [15:31:59.522] if (muffled) [15:31:59.522] invokeRestart("muffleMessage") [15:31:59.522] } [15:31:59.522] else if (inherits(cond, "warning")) { [15:31:59.522] muffled <- grepl(pattern, "muffleWarning") [15:31:59.522] if (muffled) [15:31:59.522] invokeRestart("muffleWarning") [15:31:59.522] } [15:31:59.522] else if (inherits(cond, "condition")) { [15:31:59.522] if (!is.null(pattern)) { [15:31:59.522] computeRestarts <- base::computeRestarts [15:31:59.522] grepl <- base::grepl [15:31:59.522] restarts <- computeRestarts(cond) [15:31:59.522] for (restart in restarts) { [15:31:59.522] name <- restart$name [15:31:59.522] if (is.null(name)) [15:31:59.522] next [15:31:59.522] if (!grepl(pattern, name)) [15:31:59.522] next [15:31:59.522] invokeRestart(restart) [15:31:59.522] muffled <- TRUE [15:31:59.522] break [15:31:59.522] } [15:31:59.522] } [15:31:59.522] } [15:31:59.522] invisible(muffled) [15:31:59.522] } [15:31:59.522] muffleCondition(cond) [15:31:59.522] }) [15:31:59.522] })) [15:31:59.522] future::FutureResult(value = ...future.value$value, [15:31:59.522] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:59.522] ...future.rng), globalenv = if (FALSE) [15:31:59.522] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:59.522] ...future.globalenv.names)) [15:31:59.522] else NULL, started = ...future.startTime, version = "1.8") [15:31:59.522] }, condition = base::local({ [15:31:59.522] c <- base::c [15:31:59.522] inherits <- base::inherits [15:31:59.522] invokeRestart <- base::invokeRestart [15:31:59.522] length <- base::length [15:31:59.522] list <- base::list [15:31:59.522] seq.int <- base::seq.int [15:31:59.522] signalCondition <- base::signalCondition [15:31:59.522] sys.calls <- base::sys.calls [15:31:59.522] `[[` <- base::`[[` [15:31:59.522] `+` <- base::`+` [15:31:59.522] `<<-` <- base::`<<-` [15:31:59.522] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:59.522] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:59.522] 3L)] [15:31:59.522] } [15:31:59.522] function(cond) { [15:31:59.522] is_error <- inherits(cond, "error") [15:31:59.522] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:59.522] NULL) [15:31:59.522] if (is_error) { [15:31:59.522] sessionInformation <- function() { [15:31:59.522] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:59.522] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:59.522] search = base::search(), system = base::Sys.info()) [15:31:59.522] } [15:31:59.522] ...future.conditions[[length(...future.conditions) + [15:31:59.522] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:59.522] cond$call), session = sessionInformation(), [15:31:59.522] timestamp = base::Sys.time(), signaled = 0L) [15:31:59.522] signalCondition(cond) [15:31:59.522] } [15:31:59.522] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:59.522] "immediateCondition"))) { [15:31:59.522] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:59.522] ...future.conditions[[length(...future.conditions) + [15:31:59.522] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:59.522] if (TRUE && !signal) { [15:31:59.522] muffleCondition <- function (cond, pattern = "^muffle") [15:31:59.522] { [15:31:59.522] inherits <- base::inherits [15:31:59.522] invokeRestart <- base::invokeRestart [15:31:59.522] is.null <- base::is.null [15:31:59.522] muffled <- FALSE [15:31:59.522] if (inherits(cond, "message")) { [15:31:59.522] muffled <- grepl(pattern, "muffleMessage") [15:31:59.522] if (muffled) [15:31:59.522] invokeRestart("muffleMessage") [15:31:59.522] } [15:31:59.522] else if (inherits(cond, "warning")) { [15:31:59.522] muffled <- grepl(pattern, "muffleWarning") [15:31:59.522] if (muffled) [15:31:59.522] invokeRestart("muffleWarning") [15:31:59.522] } [15:31:59.522] else if (inherits(cond, "condition")) { [15:31:59.522] if (!is.null(pattern)) { [15:31:59.522] computeRestarts <- base::computeRestarts [15:31:59.522] grepl <- base::grepl [15:31:59.522] restarts <- computeRestarts(cond) [15:31:59.522] for (restart in restarts) { [15:31:59.522] name <- restart$name [15:31:59.522] if (is.null(name)) [15:31:59.522] next [15:31:59.522] if (!grepl(pattern, name)) [15:31:59.522] next [15:31:59.522] invokeRestart(restart) [15:31:59.522] muffled <- TRUE [15:31:59.522] break [15:31:59.522] } [15:31:59.522] } [15:31:59.522] } [15:31:59.522] invisible(muffled) [15:31:59.522] } [15:31:59.522] muffleCondition(cond, pattern = "^muffle") [15:31:59.522] } [15:31:59.522] } [15:31:59.522] else { [15:31:59.522] if (TRUE) { [15:31:59.522] muffleCondition <- function (cond, pattern = "^muffle") [15:31:59.522] { [15:31:59.522] inherits <- base::inherits [15:31:59.522] invokeRestart <- base::invokeRestart [15:31:59.522] is.null <- base::is.null [15:31:59.522] muffled <- FALSE [15:31:59.522] if (inherits(cond, "message")) { [15:31:59.522] muffled <- grepl(pattern, "muffleMessage") [15:31:59.522] if (muffled) [15:31:59.522] invokeRestart("muffleMessage") [15:31:59.522] } [15:31:59.522] else if (inherits(cond, "warning")) { [15:31:59.522] muffled <- grepl(pattern, "muffleWarning") [15:31:59.522] if (muffled) [15:31:59.522] invokeRestart("muffleWarning") [15:31:59.522] } [15:31:59.522] else if (inherits(cond, "condition")) { [15:31:59.522] if (!is.null(pattern)) { [15:31:59.522] computeRestarts <- base::computeRestarts [15:31:59.522] grepl <- base::grepl [15:31:59.522] restarts <- computeRestarts(cond) [15:31:59.522] for (restart in restarts) { [15:31:59.522] name <- restart$name [15:31:59.522] if (is.null(name)) [15:31:59.522] next [15:31:59.522] if (!grepl(pattern, name)) [15:31:59.522] next [15:31:59.522] invokeRestart(restart) [15:31:59.522] muffled <- TRUE [15:31:59.522] break [15:31:59.522] } [15:31:59.522] } [15:31:59.522] } [15:31:59.522] invisible(muffled) [15:31:59.522] } [15:31:59.522] muffleCondition(cond, pattern = "^muffle") [15:31:59.522] } [15:31:59.522] } [15:31:59.522] } [15:31:59.522] })) [15:31:59.522] }, error = function(ex) { [15:31:59.522] base::structure(base::list(value = NULL, visible = NULL, [15:31:59.522] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:59.522] ...future.rng), started = ...future.startTime, [15:31:59.522] finished = Sys.time(), session_uuid = NA_character_, [15:31:59.522] version = "1.8"), class = "FutureResult") [15:31:59.522] }, finally = { [15:31:59.522] if (!identical(...future.workdir, getwd())) [15:31:59.522] setwd(...future.workdir) [15:31:59.522] { [15:31:59.522] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:59.522] ...future.oldOptions$nwarnings <- NULL [15:31:59.522] } [15:31:59.522] base::options(...future.oldOptions) [15:31:59.522] if (.Platform$OS.type == "windows") { [15:31:59.522] old_names <- names(...future.oldEnvVars) [15:31:59.522] envs <- base::Sys.getenv() [15:31:59.522] names <- names(envs) [15:31:59.522] common <- intersect(names, old_names) [15:31:59.522] added <- setdiff(names, old_names) [15:31:59.522] removed <- setdiff(old_names, names) [15:31:59.522] changed <- common[...future.oldEnvVars[common] != [15:31:59.522] envs[common]] [15:31:59.522] NAMES <- toupper(changed) [15:31:59.522] args <- list() [15:31:59.522] for (kk in seq_along(NAMES)) { [15:31:59.522] name <- changed[[kk]] [15:31:59.522] NAME <- NAMES[[kk]] [15:31:59.522] if (name != NAME && is.element(NAME, old_names)) [15:31:59.522] next [15:31:59.522] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:59.522] } [15:31:59.522] NAMES <- toupper(added) [15:31:59.522] for (kk in seq_along(NAMES)) { [15:31:59.522] name <- added[[kk]] [15:31:59.522] NAME <- NAMES[[kk]] [15:31:59.522] if (name != NAME && is.element(NAME, old_names)) [15:31:59.522] next [15:31:59.522] args[[name]] <- "" [15:31:59.522] } [15:31:59.522] NAMES <- toupper(removed) [15:31:59.522] for (kk in seq_along(NAMES)) { [15:31:59.522] name <- removed[[kk]] [15:31:59.522] NAME <- NAMES[[kk]] [15:31:59.522] if (name != NAME && is.element(NAME, old_names)) [15:31:59.522] next [15:31:59.522] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:59.522] } [15:31:59.522] if (length(args) > 0) [15:31:59.522] base::do.call(base::Sys.setenv, args = args) [15:31:59.522] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:59.522] } [15:31:59.522] else { [15:31:59.522] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:59.522] } [15:31:59.522] { [15:31:59.522] if (base::length(...future.futureOptionsAdded) > [15:31:59.522] 0L) { [15:31:59.522] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:59.522] base::names(opts) <- ...future.futureOptionsAdded [15:31:59.522] base::options(opts) [15:31:59.522] } [15:31:59.522] { [15:31:59.522] { [15:31:59.522] base::options(mc.cores = ...future.mc.cores.old) [15:31:59.522] NULL [15:31:59.522] } [15:31:59.522] options(future.plan = NULL) [15:31:59.522] if (is.na(NA_character_)) [15:31:59.522] Sys.unsetenv("R_FUTURE_PLAN") [15:31:59.522] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:59.522] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:59.522] .init = FALSE) [15:31:59.522] } [15:31:59.522] } [15:31:59.522] } [15:31:59.522] }) [15:31:59.522] if (TRUE) { [15:31:59.522] base::sink(type = "output", split = FALSE) [15:31:59.522] if (TRUE) { [15:31:59.522] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:59.522] } [15:31:59.522] else { [15:31:59.522] ...future.result["stdout"] <- base::list(NULL) [15:31:59.522] } [15:31:59.522] base::close(...future.stdout) [15:31:59.522] ...future.stdout <- NULL [15:31:59.522] } [15:31:59.522] ...future.result$conditions <- ...future.conditions [15:31:59.522] ...future.result$finished <- base::Sys.time() [15:31:59.522] ...future.result [15:31:59.522] } [15:31:59.531] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:59.532] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:59.532] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:59.533] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:59.535] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:59.535] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... [15:31:59.536] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... DONE [15:31:59.536] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:59.536] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:59.537] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:59.537] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:59.537] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:59.538] MultisessionFuture started [15:31:59.538] - Launch lazy future ... done [15:31:59.539] run() for 'MultisessionFuture' ... done [15:31:59.539] Created future: [15:31:59.562] receiveMessageFromWorker() for ClusterFuture ... [15:31:59.563] - Validating connection of MultisessionFuture [15:31:59.563] - received message: FutureResult [15:31:59.564] - Received FutureResult [15:31:59.564] - Erased future from FutureRegistry [15:31:59.565] result() for ClusterFuture ... [15:31:59.565] - result already collected: FutureResult [15:31:59.565] result() for ClusterFuture ... done [15:31:59.565] receiveMessageFromWorker() for ClusterFuture ... done [15:31:59.539] MultisessionFuture: [15:31:59.539] Label: 'future_lapply-1' [15:31:59.539] Expression: [15:31:59.539] { [15:31:59.539] do.call(function(...) { [15:31:59.539] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:59.539] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:59.539] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:59.539] on.exit(options(oopts), add = TRUE) [15:31:59.539] } [15:31:59.539] { [15:31:59.539] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:59.539] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:59.539] ...future.FUN(...future.X_jj, ...) [15:31:59.539] }) [15:31:59.539] } [15:31:59.539] }, args = future.call.arguments) [15:31:59.539] } [15:31:59.539] Lazy evaluation: FALSE [15:31:59.539] Asynchronous evaluation: TRUE [15:31:59.539] Local evaluation: TRUE [15:31:59.539] Environment: R_GlobalEnv [15:31:59.539] Capture standard output: TRUE [15:31:59.539] Capture condition classes: 'condition' (excluding 'nothing') [15:31:59.539] Globals: 5 objects totaling 2.41 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 232 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:59.539] Packages: [15:31:59.539] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:59.539] Resolved: TRUE [15:31:59.539] Value: [15:31:59.539] Conditions captured: [15:31:59.539] Early signaling: FALSE [15:31:59.539] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:59.539] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:59.566] Chunk #1 of 2 ... DONE [15:31:59.567] Chunk #2 of 2 ... [15:31:59.567] - Finding globals in 'X' for chunk #2 ... [15:31:59.567] getGlobalsAndPackages() ... [15:31:59.568] Searching for globals... [15:31:59.568] [15:31:59.569] Searching for globals ... DONE [15:31:59.569] - globals: [0] [15:31:59.569] getGlobalsAndPackages() ... DONE [15:31:59.569] + additional globals found: [n=0] [15:31:59.570] + additional namespaces needed: [n=0] [15:31:59.570] - Finding globals in 'X' for chunk #2 ... DONE [15:31:59.570] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:59.571] - seeds: [15:31:59.571] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:59.571] getGlobalsAndPackages() ... [15:31:59.572] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:59.572] Resolving globals: FALSE [15:31:59.572] Tweak future expression to call with '...' arguments ... [15:31:59.573] { [15:31:59.573] do.call(function(...) { [15:31:59.573] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:59.573] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:59.573] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:59.573] on.exit(options(oopts), add = TRUE) [15:31:59.573] } [15:31:59.573] { [15:31:59.573] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:59.573] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:59.573] ...future.FUN(...future.X_jj, ...) [15:31:59.573] }) [15:31:59.573] } [15:31:59.573] }, args = future.call.arguments) [15:31:59.573] } [15:31:59.574] Tweak future expression to call with '...' arguments ... DONE [15:31:59.574] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:59.575] [15:31:59.575] getGlobalsAndPackages() ... DONE [15:31:59.576] run() for 'Future' ... [15:31:59.576] - state: 'created' [15:31:59.577] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:59.595] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:59.596] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:59.596] - Field: 'node' [15:31:59.597] - Field: 'label' [15:31:59.597] - Field: 'local' [15:31:59.597] - Field: 'owner' [15:31:59.598] - Field: 'envir' [15:31:59.598] - Field: 'workers' [15:31:59.598] - Field: 'packages' [15:31:59.599] - Field: 'gc' [15:31:59.599] - Field: 'conditions' [15:31:59.599] - Field: 'persistent' [15:31:59.599] - Field: 'expr' [15:31:59.600] - Field: 'uuid' [15:31:59.600] - Field: 'seed' [15:31:59.600] - Field: 'version' [15:31:59.601] - Field: 'result' [15:31:59.601] - Field: 'asynchronous' [15:31:59.601] - Field: 'calls' [15:31:59.602] - Field: 'globals' [15:31:59.602] - Field: 'stdout' [15:31:59.602] - Field: 'earlySignal' [15:31:59.603] - Field: 'lazy' [15:31:59.603] - Field: 'state' [15:31:59.603] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:59.604] - Launch lazy future ... [15:31:59.604] Packages needed by the future expression (n = 0): [15:31:59.605] Packages needed by future strategies (n = 0): [15:31:59.606] { [15:31:59.606] { [15:31:59.606] { [15:31:59.606] ...future.startTime <- base::Sys.time() [15:31:59.606] { [15:31:59.606] { [15:31:59.606] { [15:31:59.606] { [15:31:59.606] base::local({ [15:31:59.606] has_future <- base::requireNamespace("future", [15:31:59.606] quietly = TRUE) [15:31:59.606] if (has_future) { [15:31:59.606] ns <- base::getNamespace("future") [15:31:59.606] version <- ns[[".package"]][["version"]] [15:31:59.606] if (is.null(version)) [15:31:59.606] version <- utils::packageVersion("future") [15:31:59.606] } [15:31:59.606] else { [15:31:59.606] version <- NULL [15:31:59.606] } [15:31:59.606] if (!has_future || version < "1.8.0") { [15:31:59.606] info <- base::c(r_version = base::gsub("R version ", [15:31:59.606] "", base::R.version$version.string), [15:31:59.606] platform = base::sprintf("%s (%s-bit)", [15:31:59.606] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:59.606] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:59.606] "release", "version")], collapse = " "), [15:31:59.606] hostname = base::Sys.info()[["nodename"]]) [15:31:59.606] info <- base::sprintf("%s: %s", base::names(info), [15:31:59.606] info) [15:31:59.606] info <- base::paste(info, collapse = "; ") [15:31:59.606] if (!has_future) { [15:31:59.606] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:59.606] info) [15:31:59.606] } [15:31:59.606] else { [15:31:59.606] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:59.606] info, version) [15:31:59.606] } [15:31:59.606] base::stop(msg) [15:31:59.606] } [15:31:59.606] }) [15:31:59.606] } [15:31:59.606] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:59.606] base::options(mc.cores = 1L) [15:31:59.606] } [15:31:59.606] ...future.strategy.old <- future::plan("list") [15:31:59.606] options(future.plan = NULL) [15:31:59.606] Sys.unsetenv("R_FUTURE_PLAN") [15:31:59.606] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:59.606] } [15:31:59.606] ...future.workdir <- getwd() [15:31:59.606] } [15:31:59.606] ...future.oldOptions <- base::as.list(base::.Options) [15:31:59.606] ...future.oldEnvVars <- base::Sys.getenv() [15:31:59.606] } [15:31:59.606] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:59.606] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:59.606] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:59.606] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:59.606] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:59.606] future.stdout.windows.reencode = NULL, width = 80L) [15:31:59.606] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:59.606] base::names(...future.oldOptions)) [15:31:59.606] } [15:31:59.606] if (FALSE) { [15:31:59.606] } [15:31:59.606] else { [15:31:59.606] if (TRUE) { [15:31:59.606] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:59.606] open = "w") [15:31:59.606] } [15:31:59.606] else { [15:31:59.606] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:59.606] windows = "NUL", "/dev/null"), open = "w") [15:31:59.606] } [15:31:59.606] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:59.606] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:59.606] base::sink(type = "output", split = FALSE) [15:31:59.606] base::close(...future.stdout) [15:31:59.606] }, add = TRUE) [15:31:59.606] } [15:31:59.606] ...future.frame <- base::sys.nframe() [15:31:59.606] ...future.conditions <- base::list() [15:31:59.606] ...future.rng <- base::globalenv()$.Random.seed [15:31:59.606] if (FALSE) { [15:31:59.606] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:59.606] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:59.606] } [15:31:59.606] ...future.result <- base::tryCatch({ [15:31:59.606] base::withCallingHandlers({ [15:31:59.606] ...future.value <- base::withVisible(base::local({ [15:31:59.606] ...future.makeSendCondition <- base::local({ [15:31:59.606] sendCondition <- NULL [15:31:59.606] function(frame = 1L) { [15:31:59.606] if (is.function(sendCondition)) [15:31:59.606] return(sendCondition) [15:31:59.606] ns <- getNamespace("parallel") [15:31:59.606] if (exists("sendData", mode = "function", [15:31:59.606] envir = ns)) { [15:31:59.606] parallel_sendData <- get("sendData", mode = "function", [15:31:59.606] envir = ns) [15:31:59.606] envir <- sys.frame(frame) [15:31:59.606] master <- NULL [15:31:59.606] while (!identical(envir, .GlobalEnv) && [15:31:59.606] !identical(envir, emptyenv())) { [15:31:59.606] if (exists("master", mode = "list", envir = envir, [15:31:59.606] inherits = FALSE)) { [15:31:59.606] master <- get("master", mode = "list", [15:31:59.606] envir = envir, inherits = FALSE) [15:31:59.606] if (inherits(master, c("SOCKnode", [15:31:59.606] "SOCK0node"))) { [15:31:59.606] sendCondition <<- function(cond) { [15:31:59.606] data <- list(type = "VALUE", value = cond, [15:31:59.606] success = TRUE) [15:31:59.606] parallel_sendData(master, data) [15:31:59.606] } [15:31:59.606] return(sendCondition) [15:31:59.606] } [15:31:59.606] } [15:31:59.606] frame <- frame + 1L [15:31:59.606] envir <- sys.frame(frame) [15:31:59.606] } [15:31:59.606] } [15:31:59.606] sendCondition <<- function(cond) NULL [15:31:59.606] } [15:31:59.606] }) [15:31:59.606] withCallingHandlers({ [15:31:59.606] { [15:31:59.606] do.call(function(...) { [15:31:59.606] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:59.606] if (!identical(...future.globals.maxSize.org, [15:31:59.606] ...future.globals.maxSize)) { [15:31:59.606] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:59.606] on.exit(options(oopts), add = TRUE) [15:31:59.606] } [15:31:59.606] { [15:31:59.606] lapply(seq_along(...future.elements_ii), [15:31:59.606] FUN = function(jj) { [15:31:59.606] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:59.606] ...future.FUN(...future.X_jj, ...) [15:31:59.606] }) [15:31:59.606] } [15:31:59.606] }, args = future.call.arguments) [15:31:59.606] } [15:31:59.606] }, immediateCondition = function(cond) { [15:31:59.606] sendCondition <- ...future.makeSendCondition() [15:31:59.606] sendCondition(cond) [15:31:59.606] muffleCondition <- function (cond, pattern = "^muffle") [15:31:59.606] { [15:31:59.606] inherits <- base::inherits [15:31:59.606] invokeRestart <- base::invokeRestart [15:31:59.606] is.null <- base::is.null [15:31:59.606] muffled <- FALSE [15:31:59.606] if (inherits(cond, "message")) { [15:31:59.606] muffled <- grepl(pattern, "muffleMessage") [15:31:59.606] if (muffled) [15:31:59.606] invokeRestart("muffleMessage") [15:31:59.606] } [15:31:59.606] else if (inherits(cond, "warning")) { [15:31:59.606] muffled <- grepl(pattern, "muffleWarning") [15:31:59.606] if (muffled) [15:31:59.606] invokeRestart("muffleWarning") [15:31:59.606] } [15:31:59.606] else if (inherits(cond, "condition")) { [15:31:59.606] if (!is.null(pattern)) { [15:31:59.606] computeRestarts <- base::computeRestarts [15:31:59.606] grepl <- base::grepl [15:31:59.606] restarts <- computeRestarts(cond) [15:31:59.606] for (restart in restarts) { [15:31:59.606] name <- restart$name [15:31:59.606] if (is.null(name)) [15:31:59.606] next [15:31:59.606] if (!grepl(pattern, name)) [15:31:59.606] next [15:31:59.606] invokeRestart(restart) [15:31:59.606] muffled <- TRUE [15:31:59.606] break [15:31:59.606] } [15:31:59.606] } [15:31:59.606] } [15:31:59.606] invisible(muffled) [15:31:59.606] } [15:31:59.606] muffleCondition(cond) [15:31:59.606] }) [15:31:59.606] })) [15:31:59.606] future::FutureResult(value = ...future.value$value, [15:31:59.606] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:59.606] ...future.rng), globalenv = if (FALSE) [15:31:59.606] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:59.606] ...future.globalenv.names)) [15:31:59.606] else NULL, started = ...future.startTime, version = "1.8") [15:31:59.606] }, condition = base::local({ [15:31:59.606] c <- base::c [15:31:59.606] inherits <- base::inherits [15:31:59.606] invokeRestart <- base::invokeRestart [15:31:59.606] length <- base::length [15:31:59.606] list <- base::list [15:31:59.606] seq.int <- base::seq.int [15:31:59.606] signalCondition <- base::signalCondition [15:31:59.606] sys.calls <- base::sys.calls [15:31:59.606] `[[` <- base::`[[` [15:31:59.606] `+` <- base::`+` [15:31:59.606] `<<-` <- base::`<<-` [15:31:59.606] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:59.606] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:59.606] 3L)] [15:31:59.606] } [15:31:59.606] function(cond) { [15:31:59.606] is_error <- inherits(cond, "error") [15:31:59.606] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:59.606] NULL) [15:31:59.606] if (is_error) { [15:31:59.606] sessionInformation <- function() { [15:31:59.606] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:59.606] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:59.606] search = base::search(), system = base::Sys.info()) [15:31:59.606] } [15:31:59.606] ...future.conditions[[length(...future.conditions) + [15:31:59.606] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:59.606] cond$call), session = sessionInformation(), [15:31:59.606] timestamp = base::Sys.time(), signaled = 0L) [15:31:59.606] signalCondition(cond) [15:31:59.606] } [15:31:59.606] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:59.606] "immediateCondition"))) { [15:31:59.606] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:59.606] ...future.conditions[[length(...future.conditions) + [15:31:59.606] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:59.606] if (TRUE && !signal) { [15:31:59.606] muffleCondition <- function (cond, pattern = "^muffle") [15:31:59.606] { [15:31:59.606] inherits <- base::inherits [15:31:59.606] invokeRestart <- base::invokeRestart [15:31:59.606] is.null <- base::is.null [15:31:59.606] muffled <- FALSE [15:31:59.606] if (inherits(cond, "message")) { [15:31:59.606] muffled <- grepl(pattern, "muffleMessage") [15:31:59.606] if (muffled) [15:31:59.606] invokeRestart("muffleMessage") [15:31:59.606] } [15:31:59.606] else if (inherits(cond, "warning")) { [15:31:59.606] muffled <- grepl(pattern, "muffleWarning") [15:31:59.606] if (muffled) [15:31:59.606] invokeRestart("muffleWarning") [15:31:59.606] } [15:31:59.606] else if (inherits(cond, "condition")) { [15:31:59.606] if (!is.null(pattern)) { [15:31:59.606] computeRestarts <- base::computeRestarts [15:31:59.606] grepl <- base::grepl [15:31:59.606] restarts <- computeRestarts(cond) [15:31:59.606] for (restart in restarts) { [15:31:59.606] name <- restart$name [15:31:59.606] if (is.null(name)) [15:31:59.606] next [15:31:59.606] if (!grepl(pattern, name)) [15:31:59.606] next [15:31:59.606] invokeRestart(restart) [15:31:59.606] muffled <- TRUE [15:31:59.606] break [15:31:59.606] } [15:31:59.606] } [15:31:59.606] } [15:31:59.606] invisible(muffled) [15:31:59.606] } [15:31:59.606] muffleCondition(cond, pattern = "^muffle") [15:31:59.606] } [15:31:59.606] } [15:31:59.606] else { [15:31:59.606] if (TRUE) { [15:31:59.606] muffleCondition <- function (cond, pattern = "^muffle") [15:31:59.606] { [15:31:59.606] inherits <- base::inherits [15:31:59.606] invokeRestart <- base::invokeRestart [15:31:59.606] is.null <- base::is.null [15:31:59.606] muffled <- FALSE [15:31:59.606] if (inherits(cond, "message")) { [15:31:59.606] muffled <- grepl(pattern, "muffleMessage") [15:31:59.606] if (muffled) [15:31:59.606] invokeRestart("muffleMessage") [15:31:59.606] } [15:31:59.606] else if (inherits(cond, "warning")) { [15:31:59.606] muffled <- grepl(pattern, "muffleWarning") [15:31:59.606] if (muffled) [15:31:59.606] invokeRestart("muffleWarning") [15:31:59.606] } [15:31:59.606] else if (inherits(cond, "condition")) { [15:31:59.606] if (!is.null(pattern)) { [15:31:59.606] computeRestarts <- base::computeRestarts [15:31:59.606] grepl <- base::grepl [15:31:59.606] restarts <- computeRestarts(cond) [15:31:59.606] for (restart in restarts) { [15:31:59.606] name <- restart$name [15:31:59.606] if (is.null(name)) [15:31:59.606] next [15:31:59.606] if (!grepl(pattern, name)) [15:31:59.606] next [15:31:59.606] invokeRestart(restart) [15:31:59.606] muffled <- TRUE [15:31:59.606] break [15:31:59.606] } [15:31:59.606] } [15:31:59.606] } [15:31:59.606] invisible(muffled) [15:31:59.606] } [15:31:59.606] muffleCondition(cond, pattern = "^muffle") [15:31:59.606] } [15:31:59.606] } [15:31:59.606] } [15:31:59.606] })) [15:31:59.606] }, error = function(ex) { [15:31:59.606] base::structure(base::list(value = NULL, visible = NULL, [15:31:59.606] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:59.606] ...future.rng), started = ...future.startTime, [15:31:59.606] finished = Sys.time(), session_uuid = NA_character_, [15:31:59.606] version = "1.8"), class = "FutureResult") [15:31:59.606] }, finally = { [15:31:59.606] if (!identical(...future.workdir, getwd())) [15:31:59.606] setwd(...future.workdir) [15:31:59.606] { [15:31:59.606] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:59.606] ...future.oldOptions$nwarnings <- NULL [15:31:59.606] } [15:31:59.606] base::options(...future.oldOptions) [15:31:59.606] if (.Platform$OS.type == "windows") { [15:31:59.606] old_names <- names(...future.oldEnvVars) [15:31:59.606] envs <- base::Sys.getenv() [15:31:59.606] names <- names(envs) [15:31:59.606] common <- intersect(names, old_names) [15:31:59.606] added <- setdiff(names, old_names) [15:31:59.606] removed <- setdiff(old_names, names) [15:31:59.606] changed <- common[...future.oldEnvVars[common] != [15:31:59.606] envs[common]] [15:31:59.606] NAMES <- toupper(changed) [15:31:59.606] args <- list() [15:31:59.606] for (kk in seq_along(NAMES)) { [15:31:59.606] name <- changed[[kk]] [15:31:59.606] NAME <- NAMES[[kk]] [15:31:59.606] if (name != NAME && is.element(NAME, old_names)) [15:31:59.606] next [15:31:59.606] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:59.606] } [15:31:59.606] NAMES <- toupper(added) [15:31:59.606] for (kk in seq_along(NAMES)) { [15:31:59.606] name <- added[[kk]] [15:31:59.606] NAME <- NAMES[[kk]] [15:31:59.606] if (name != NAME && is.element(NAME, old_names)) [15:31:59.606] next [15:31:59.606] args[[name]] <- "" [15:31:59.606] } [15:31:59.606] NAMES <- toupper(removed) [15:31:59.606] for (kk in seq_along(NAMES)) { [15:31:59.606] name <- removed[[kk]] [15:31:59.606] NAME <- NAMES[[kk]] [15:31:59.606] if (name != NAME && is.element(NAME, old_names)) [15:31:59.606] next [15:31:59.606] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:59.606] } [15:31:59.606] if (length(args) > 0) [15:31:59.606] base::do.call(base::Sys.setenv, args = args) [15:31:59.606] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:59.606] } [15:31:59.606] else { [15:31:59.606] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:59.606] } [15:31:59.606] { [15:31:59.606] if (base::length(...future.futureOptionsAdded) > [15:31:59.606] 0L) { [15:31:59.606] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:59.606] base::names(opts) <- ...future.futureOptionsAdded [15:31:59.606] base::options(opts) [15:31:59.606] } [15:31:59.606] { [15:31:59.606] { [15:31:59.606] base::options(mc.cores = ...future.mc.cores.old) [15:31:59.606] NULL [15:31:59.606] } [15:31:59.606] options(future.plan = NULL) [15:31:59.606] if (is.na(NA_character_)) [15:31:59.606] Sys.unsetenv("R_FUTURE_PLAN") [15:31:59.606] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:59.606] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:59.606] .init = FALSE) [15:31:59.606] } [15:31:59.606] } [15:31:59.606] } [15:31:59.606] }) [15:31:59.606] if (TRUE) { [15:31:59.606] base::sink(type = "output", split = FALSE) [15:31:59.606] if (TRUE) { [15:31:59.606] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:59.606] } [15:31:59.606] else { [15:31:59.606] ...future.result["stdout"] <- base::list(NULL) [15:31:59.606] } [15:31:59.606] base::close(...future.stdout) [15:31:59.606] ...future.stdout <- NULL [15:31:59.606] } [15:31:59.606] ...future.result$conditions <- ...future.conditions [15:31:59.606] ...future.result$finished <- base::Sys.time() [15:31:59.606] ...future.result [15:31:59.606] } [15:31:59.616] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:59.617] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:59.618] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:59.619] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:59.620] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:59.620] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... [15:31:59.621] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... DONE [15:31:59.621] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:59.622] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:59.622] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:59.623] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:59.623] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:59.624] MultisessionFuture started [15:31:59.624] - Launch lazy future ... done [15:31:59.625] run() for 'MultisessionFuture' ... done [15:31:59.625] Created future: [15:31:59.657] receiveMessageFromWorker() for ClusterFuture ... [15:31:59.657] - Validating connection of MultisessionFuture [15:31:59.658] - received message: FutureResult [15:31:59.658] - Received FutureResult [15:31:59.658] - Erased future from FutureRegistry [15:31:59.659] result() for ClusterFuture ... [15:31:59.659] - result already collected: FutureResult [15:31:59.659] result() for ClusterFuture ... done [15:31:59.659] receiveMessageFromWorker() for ClusterFuture ... done [15:31:59.625] MultisessionFuture: [15:31:59.625] Label: 'future_lapply-2' [15:31:59.625] Expression: [15:31:59.625] { [15:31:59.625] do.call(function(...) { [15:31:59.625] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:59.625] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:59.625] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:59.625] on.exit(options(oopts), add = TRUE) [15:31:59.625] } [15:31:59.625] { [15:31:59.625] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:59.625] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:59.625] ...future.FUN(...future.X_jj, ...) [15:31:59.625] }) [15:31:59.625] } [15:31:59.625] }, args = future.call.arguments) [15:31:59.625] } [15:31:59.625] Lazy evaluation: FALSE [15:31:59.625] Asynchronous evaluation: TRUE [15:31:59.625] Local evaluation: TRUE [15:31:59.625] Environment: R_GlobalEnv [15:31:59.625] Capture standard output: TRUE [15:31:59.625] Capture condition classes: 'condition' (excluding 'nothing') [15:31:59.625] Globals: 5 objects totaling 2.41 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 224 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:59.625] Packages: [15:31:59.625] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:59.625] Resolved: TRUE [15:31:59.625] Value: [15:31:59.625] Conditions captured: [15:31:59.625] Early signaling: FALSE [15:31:59.625] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:59.625] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:59.660] Chunk #2 of 2 ... DONE [15:31:59.660] Launching 2 futures (chunks) ... DONE [15:31:59.660] Resolving 2 futures (chunks) ... [15:31:59.661] resolve() on list ... [15:31:59.661] recursive: 0 [15:31:59.661] length: 2 [15:31:59.661] [15:31:59.661] Future #1 [15:31:59.662] result() for ClusterFuture ... [15:31:59.662] - result already collected: FutureResult [15:31:59.662] result() for ClusterFuture ... done [15:31:59.662] result() for ClusterFuture ... [15:31:59.663] - result already collected: FutureResult [15:31:59.663] result() for ClusterFuture ... done [15:31:59.663] signalConditionsASAP(MultisessionFuture, pos=1) ... [15:31:59.663] - nx: 2 [15:31:59.663] - relay: TRUE [15:31:59.664] - stdout: TRUE [15:31:59.664] - signal: TRUE [15:31:59.664] - resignal: FALSE [15:31:59.664] - force: TRUE [15:31:59.664] - relayed: [n=2] FALSE, FALSE [15:31:59.665] - queued futures: [n=2] FALSE, FALSE [15:31:59.665] - until=1 [15:31:59.666] - relaying element #1 [15:31:59.666] result() for ClusterFuture ... [15:31:59.666] - result already collected: FutureResult [15:31:59.667] result() for ClusterFuture ... done [15:31:59.667] result() for ClusterFuture ... [15:31:59.667] - result already collected: FutureResult [15:31:59.668] result() for ClusterFuture ... done [15:31:59.668] result() for ClusterFuture ... [15:31:59.668] - result already collected: FutureResult [15:31:59.669] result() for ClusterFuture ... done [15:31:59.669] result() for ClusterFuture ... [15:31:59.669] - result already collected: FutureResult [15:31:59.670] result() for ClusterFuture ... done [15:31:59.670] - relayed: [n=2] TRUE, FALSE [15:31:59.670] - queued futures: [n=2] TRUE, FALSE [15:31:59.671] signalConditionsASAP(MultisessionFuture, pos=1) ... done [15:31:59.671] length: 1 (resolved future 1) [15:31:59.672] Future #2 [15:31:59.672] result() for ClusterFuture ... [15:31:59.672] - result already collected: FutureResult [15:31:59.673] result() for ClusterFuture ... done [15:31:59.673] result() for ClusterFuture ... [15:31:59.673] - result already collected: FutureResult [15:31:59.674] result() for ClusterFuture ... done [15:31:59.674] signalConditionsASAP(MultisessionFuture, pos=2) ... [15:31:59.674] - nx: 2 [15:31:59.675] - relay: TRUE [15:31:59.675] - stdout: TRUE [15:31:59.676] - signal: TRUE [15:31:59.676] - resignal: FALSE [15:31:59.676] - force: TRUE [15:31:59.676] - relayed: [n=2] TRUE, FALSE [15:31:59.676] - queued futures: [n=2] TRUE, FALSE [15:31:59.677] - until=2 [15:31:59.677] - relaying element #2 [15:31:59.677] result() for ClusterFuture ... [15:31:59.677] - result already collected: FutureResult [15:31:59.678] result() for ClusterFuture ... done [15:31:59.678] result() for ClusterFuture ... [15:31:59.678] - result already collected: FutureResult [15:31:59.679] result() for ClusterFuture ... done [15:31:59.679] result() for ClusterFuture ... [15:31:59.679] - result already collected: FutureResult [15:31:59.680] result() for ClusterFuture ... done [15:31:59.680] result() for ClusterFuture ... [15:31:59.680] - result already collected: FutureResult [15:31:59.681] result() for ClusterFuture ... done [15:31:59.681] - relayed: [n=2] TRUE, TRUE [15:31:59.681] - queued futures: [n=2] TRUE, TRUE [15:31:59.682] signalConditionsASAP(MultisessionFuture, pos=2) ... done [15:31:59.682] length: 0 (resolved future 2) [15:31:59.682] Relaying remaining futures [15:31:59.683] signalConditionsASAP(NULL, pos=0) ... [15:31:59.683] - nx: 2 [15:31:59.683] - relay: TRUE [15:31:59.684] - stdout: TRUE [15:31:59.684] - signal: TRUE [15:31:59.684] - resignal: FALSE [15:31:59.685] - force: TRUE [15:31:59.685] - relayed: [n=2] TRUE, TRUE [15:31:59.685] - queued futures: [n=2] TRUE, TRUE - flush all [15:31:59.686] - relayed: [n=2] TRUE, TRUE [15:31:59.686] - queued futures: [n=2] TRUE, TRUE [15:31:59.686] signalConditionsASAP(NULL, pos=0) ... done [15:31:59.687] resolve() on list ... DONE [15:31:59.687] result() for ClusterFuture ... [15:31:59.687] - result already collected: FutureResult [15:31:59.688] result() for ClusterFuture ... done [15:31:59.688] result() for ClusterFuture ... [15:31:59.688] - result already collected: FutureResult [15:31:59.689] result() for ClusterFuture ... done [15:31:59.689] result() for ClusterFuture ... [15:31:59.689] - result already collected: FutureResult [15:31:59.690] result() for ClusterFuture ... done [15:31:59.690] result() for ClusterFuture ... [15:31:59.690] - result already collected: FutureResult [15:31:59.691] result() for ClusterFuture ... done [15:31:59.691] - Number of value chunks collected: 2 [15:31:59.691] Resolving 2 futures (chunks) ... DONE [15:31:59.692] Reducing values from 2 chunks ... [15:31:59.692] - Number of values collected after concatenation: 4 [15:31:59.692] - Number of values expected: 4 [15:31:59.693] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [15:31:59.693] Reducing values from 2 chunks ... DONE [15:31:59.693] 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 [15:31:59.699] future_lapply() ... [15:31:59.705] Number of chunks: 2 [15:31:59.706] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [15:31:59.706] getGlobalsAndPackagesXApply() ... [15:31:59.707] - future.globals: TRUE [15:31:59.707] getGlobalsAndPackages() ... [15:31:59.707] Searching for globals... [15:31:59.711] - globals found: [2] 'FUN', '.Internal' [15:31:59.711] Searching for globals ... DONE [15:31:59.711] Resolving globals: FALSE [15:31:59.712] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:59.713] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:59.714] - globals: [1] 'FUN' [15:31:59.714] [15:31:59.714] getGlobalsAndPackages() ... DONE [15:31:59.715] - globals found/used: [n=1] 'FUN' [15:31:59.715] - needed namespaces: [n=0] [15:31:59.715] Finding globals ... DONE [15:31:59.716] - use_args: TRUE [15:31:59.716] - Getting '...' globals ... [15:31:59.717] resolve() on list ... [15:31:59.717] recursive: 0 [15:31:59.718] length: 1 [15:31:59.718] elements: '...' [15:31:59.718] length: 0 (resolved future 1) [15:31:59.719] resolve() on list ... DONE [15:31:59.719] - '...' content: [n=1] 'length' [15:31:59.719] List of 1 [15:31:59.719] $ ...:List of 1 [15:31:59.719] ..$ length: int 2 [15:31:59.719] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:59.719] - attr(*, "where")=List of 1 [15:31:59.719] ..$ ...: [15:31:59.719] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:59.719] - attr(*, "resolved")= logi TRUE [15:31:59.719] - attr(*, "total_size")= num NA [15:31:59.732] - Getting '...' globals ... DONE [15:31:59.733] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:59.733] List of 2 [15:31:59.733] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:59.733] $ ... :List of 1 [15:31:59.733] ..$ length: int 2 [15:31:59.733] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:59.733] - attr(*, "where")=List of 2 [15:31:59.733] ..$ ...future.FUN: [15:31:59.733] ..$ ... : [15:31:59.733] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:59.733] - attr(*, "resolved")= logi FALSE [15:31:59.733] - attr(*, "total_size")= num 2240 [15:31:59.741] Packages to be attached in all futures: [n=0] [15:31:59.741] getGlobalsAndPackagesXApply() ... DONE [15:31:59.742] Number of futures (= number of chunks): 2 [15:31:59.742] Launching 2 futures (chunks) ... [15:31:59.742] Chunk #1 of 2 ... [15:31:59.743] - Finding globals in 'X' for chunk #1 ... [15:31:59.743] getGlobalsAndPackages() ... [15:31:59.743] Searching for globals... [15:31:59.744] [15:31:59.744] Searching for globals ... DONE [15:31:59.744] - globals: [0] [15:31:59.745] getGlobalsAndPackages() ... DONE [15:31:59.745] + additional globals found: [n=0] [15:31:59.745] + additional namespaces needed: [n=0] [15:31:59.745] - Finding globals in 'X' for chunk #1 ... DONE [15:31:59.746] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:59.746] - seeds: [15:31:59.746] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:59.747] getGlobalsAndPackages() ... [15:31:59.747] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:59.747] Resolving globals: FALSE [15:31:59.747] Tweak future expression to call with '...' arguments ... [15:31:59.748] { [15:31:59.748] do.call(function(...) { [15:31:59.748] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:59.748] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:59.748] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:59.748] on.exit(options(oopts), add = TRUE) [15:31:59.748] } [15:31:59.748] { [15:31:59.748] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:59.748] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:59.748] ...future.FUN(...future.X_jj, ...) [15:31:59.748] }) [15:31:59.748] } [15:31:59.748] }, args = future.call.arguments) [15:31:59.748] } [15:31:59.749] Tweak future expression to call with '...' arguments ... DONE [15:31:59.749] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:59.750] [15:31:59.750] getGlobalsAndPackages() ... DONE [15:31:59.751] run() for 'Future' ... [15:31:59.751] - state: 'created' [15:31:59.751] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:59.769] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:59.769] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:59.769] - Field: 'node' [15:31:59.770] - Field: 'label' [15:31:59.770] - Field: 'local' [15:31:59.770] - Field: 'owner' [15:31:59.771] - Field: 'envir' [15:31:59.771] - Field: 'workers' [15:31:59.771] - Field: 'packages' [15:31:59.771] - Field: 'gc' [15:31:59.772] - Field: 'conditions' [15:31:59.772] - Field: 'persistent' [15:31:59.772] - Field: 'expr' [15:31:59.772] - Field: 'uuid' [15:31:59.773] - Field: 'seed' [15:31:59.773] - Field: 'version' [15:31:59.773] - Field: 'result' [15:31:59.773] - Field: 'asynchronous' [15:31:59.774] - Field: 'calls' [15:31:59.774] - Field: 'globals' [15:31:59.774] - Field: 'stdout' [15:31:59.774] - Field: 'earlySignal' [15:31:59.775] - Field: 'lazy' [15:31:59.775] - Field: 'state' [15:31:59.775] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:59.775] - Launch lazy future ... [15:31:59.776] Packages needed by the future expression (n = 0): [15:31:59.776] Packages needed by future strategies (n = 0): [15:31:59.777] { [15:31:59.777] { [15:31:59.777] { [15:31:59.777] ...future.startTime <- base::Sys.time() [15:31:59.777] { [15:31:59.777] { [15:31:59.777] { [15:31:59.777] { [15:31:59.777] base::local({ [15:31:59.777] has_future <- base::requireNamespace("future", [15:31:59.777] quietly = TRUE) [15:31:59.777] if (has_future) { [15:31:59.777] ns <- base::getNamespace("future") [15:31:59.777] version <- ns[[".package"]][["version"]] [15:31:59.777] if (is.null(version)) [15:31:59.777] version <- utils::packageVersion("future") [15:31:59.777] } [15:31:59.777] else { [15:31:59.777] version <- NULL [15:31:59.777] } [15:31:59.777] if (!has_future || version < "1.8.0") { [15:31:59.777] info <- base::c(r_version = base::gsub("R version ", [15:31:59.777] "", base::R.version$version.string), [15:31:59.777] platform = base::sprintf("%s (%s-bit)", [15:31:59.777] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:59.777] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:59.777] "release", "version")], collapse = " "), [15:31:59.777] hostname = base::Sys.info()[["nodename"]]) [15:31:59.777] info <- base::sprintf("%s: %s", base::names(info), [15:31:59.777] info) [15:31:59.777] info <- base::paste(info, collapse = "; ") [15:31:59.777] if (!has_future) { [15:31:59.777] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:59.777] info) [15:31:59.777] } [15:31:59.777] else { [15:31:59.777] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:59.777] info, version) [15:31:59.777] } [15:31:59.777] base::stop(msg) [15:31:59.777] } [15:31:59.777] }) [15:31:59.777] } [15:31:59.777] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:59.777] base::options(mc.cores = 1L) [15:31:59.777] } [15:31:59.777] ...future.strategy.old <- future::plan("list") [15:31:59.777] options(future.plan = NULL) [15:31:59.777] Sys.unsetenv("R_FUTURE_PLAN") [15:31:59.777] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:59.777] } [15:31:59.777] ...future.workdir <- getwd() [15:31:59.777] } [15:31:59.777] ...future.oldOptions <- base::as.list(base::.Options) [15:31:59.777] ...future.oldEnvVars <- base::Sys.getenv() [15:31:59.777] } [15:31:59.777] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:59.777] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:59.777] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:59.777] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:59.777] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:59.777] future.stdout.windows.reencode = NULL, width = 80L) [15:31:59.777] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:59.777] base::names(...future.oldOptions)) [15:31:59.777] } [15:31:59.777] if (FALSE) { [15:31:59.777] } [15:31:59.777] else { [15:31:59.777] if (TRUE) { [15:31:59.777] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:59.777] open = "w") [15:31:59.777] } [15:31:59.777] else { [15:31:59.777] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:59.777] windows = "NUL", "/dev/null"), open = "w") [15:31:59.777] } [15:31:59.777] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:59.777] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:59.777] base::sink(type = "output", split = FALSE) [15:31:59.777] base::close(...future.stdout) [15:31:59.777] }, add = TRUE) [15:31:59.777] } [15:31:59.777] ...future.frame <- base::sys.nframe() [15:31:59.777] ...future.conditions <- base::list() [15:31:59.777] ...future.rng <- base::globalenv()$.Random.seed [15:31:59.777] if (FALSE) { [15:31:59.777] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:59.777] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:59.777] } [15:31:59.777] ...future.result <- base::tryCatch({ [15:31:59.777] base::withCallingHandlers({ [15:31:59.777] ...future.value <- base::withVisible(base::local({ [15:31:59.777] ...future.makeSendCondition <- base::local({ [15:31:59.777] sendCondition <- NULL [15:31:59.777] function(frame = 1L) { [15:31:59.777] if (is.function(sendCondition)) [15:31:59.777] return(sendCondition) [15:31:59.777] ns <- getNamespace("parallel") [15:31:59.777] if (exists("sendData", mode = "function", [15:31:59.777] envir = ns)) { [15:31:59.777] parallel_sendData <- get("sendData", mode = "function", [15:31:59.777] envir = ns) [15:31:59.777] envir <- sys.frame(frame) [15:31:59.777] master <- NULL [15:31:59.777] while (!identical(envir, .GlobalEnv) && [15:31:59.777] !identical(envir, emptyenv())) { [15:31:59.777] if (exists("master", mode = "list", envir = envir, [15:31:59.777] inherits = FALSE)) { [15:31:59.777] master <- get("master", mode = "list", [15:31:59.777] envir = envir, inherits = FALSE) [15:31:59.777] if (inherits(master, c("SOCKnode", [15:31:59.777] "SOCK0node"))) { [15:31:59.777] sendCondition <<- function(cond) { [15:31:59.777] data <- list(type = "VALUE", value = cond, [15:31:59.777] success = TRUE) [15:31:59.777] parallel_sendData(master, data) [15:31:59.777] } [15:31:59.777] return(sendCondition) [15:31:59.777] } [15:31:59.777] } [15:31:59.777] frame <- frame + 1L [15:31:59.777] envir <- sys.frame(frame) [15:31:59.777] } [15:31:59.777] } [15:31:59.777] sendCondition <<- function(cond) NULL [15:31:59.777] } [15:31:59.777] }) [15:31:59.777] withCallingHandlers({ [15:31:59.777] { [15:31:59.777] do.call(function(...) { [15:31:59.777] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:59.777] if (!identical(...future.globals.maxSize.org, [15:31:59.777] ...future.globals.maxSize)) { [15:31:59.777] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:59.777] on.exit(options(oopts), add = TRUE) [15:31:59.777] } [15:31:59.777] { [15:31:59.777] lapply(seq_along(...future.elements_ii), [15:31:59.777] FUN = function(jj) { [15:31:59.777] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:59.777] ...future.FUN(...future.X_jj, ...) [15:31:59.777] }) [15:31:59.777] } [15:31:59.777] }, args = future.call.arguments) [15:31:59.777] } [15:31:59.777] }, immediateCondition = function(cond) { [15:31:59.777] sendCondition <- ...future.makeSendCondition() [15:31:59.777] sendCondition(cond) [15:31:59.777] muffleCondition <- function (cond, pattern = "^muffle") [15:31:59.777] { [15:31:59.777] inherits <- base::inherits [15:31:59.777] invokeRestart <- base::invokeRestart [15:31:59.777] is.null <- base::is.null [15:31:59.777] muffled <- FALSE [15:31:59.777] if (inherits(cond, "message")) { [15:31:59.777] muffled <- grepl(pattern, "muffleMessage") [15:31:59.777] if (muffled) [15:31:59.777] invokeRestart("muffleMessage") [15:31:59.777] } [15:31:59.777] else if (inherits(cond, "warning")) { [15:31:59.777] muffled <- grepl(pattern, "muffleWarning") [15:31:59.777] if (muffled) [15:31:59.777] invokeRestart("muffleWarning") [15:31:59.777] } [15:31:59.777] else if (inherits(cond, "condition")) { [15:31:59.777] if (!is.null(pattern)) { [15:31:59.777] computeRestarts <- base::computeRestarts [15:31:59.777] grepl <- base::grepl [15:31:59.777] restarts <- computeRestarts(cond) [15:31:59.777] for (restart in restarts) { [15:31:59.777] name <- restart$name [15:31:59.777] if (is.null(name)) [15:31:59.777] next [15:31:59.777] if (!grepl(pattern, name)) [15:31:59.777] next [15:31:59.777] invokeRestart(restart) [15:31:59.777] muffled <- TRUE [15:31:59.777] break [15:31:59.777] } [15:31:59.777] } [15:31:59.777] } [15:31:59.777] invisible(muffled) [15:31:59.777] } [15:31:59.777] muffleCondition(cond) [15:31:59.777] }) [15:31:59.777] })) [15:31:59.777] future::FutureResult(value = ...future.value$value, [15:31:59.777] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:59.777] ...future.rng), globalenv = if (FALSE) [15:31:59.777] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:59.777] ...future.globalenv.names)) [15:31:59.777] else NULL, started = ...future.startTime, version = "1.8") [15:31:59.777] }, condition = base::local({ [15:31:59.777] c <- base::c [15:31:59.777] inherits <- base::inherits [15:31:59.777] invokeRestart <- base::invokeRestart [15:31:59.777] length <- base::length [15:31:59.777] list <- base::list [15:31:59.777] seq.int <- base::seq.int [15:31:59.777] signalCondition <- base::signalCondition [15:31:59.777] sys.calls <- base::sys.calls [15:31:59.777] `[[` <- base::`[[` [15:31:59.777] `+` <- base::`+` [15:31:59.777] `<<-` <- base::`<<-` [15:31:59.777] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:59.777] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:59.777] 3L)] [15:31:59.777] } [15:31:59.777] function(cond) { [15:31:59.777] is_error <- inherits(cond, "error") [15:31:59.777] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:59.777] NULL) [15:31:59.777] if (is_error) { [15:31:59.777] sessionInformation <- function() { [15:31:59.777] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:59.777] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:59.777] search = base::search(), system = base::Sys.info()) [15:31:59.777] } [15:31:59.777] ...future.conditions[[length(...future.conditions) + [15:31:59.777] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:59.777] cond$call), session = sessionInformation(), [15:31:59.777] timestamp = base::Sys.time(), signaled = 0L) [15:31:59.777] signalCondition(cond) [15:31:59.777] } [15:31:59.777] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:59.777] "immediateCondition"))) { [15:31:59.777] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:59.777] ...future.conditions[[length(...future.conditions) + [15:31:59.777] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:59.777] if (TRUE && !signal) { [15:31:59.777] muffleCondition <- function (cond, pattern = "^muffle") [15:31:59.777] { [15:31:59.777] inherits <- base::inherits [15:31:59.777] invokeRestart <- base::invokeRestart [15:31:59.777] is.null <- base::is.null [15:31:59.777] muffled <- FALSE [15:31:59.777] if (inherits(cond, "message")) { [15:31:59.777] muffled <- grepl(pattern, "muffleMessage") [15:31:59.777] if (muffled) [15:31:59.777] invokeRestart("muffleMessage") [15:31:59.777] } [15:31:59.777] else if (inherits(cond, "warning")) { [15:31:59.777] muffled <- grepl(pattern, "muffleWarning") [15:31:59.777] if (muffled) [15:31:59.777] invokeRestart("muffleWarning") [15:31:59.777] } [15:31:59.777] else if (inherits(cond, "condition")) { [15:31:59.777] if (!is.null(pattern)) { [15:31:59.777] computeRestarts <- base::computeRestarts [15:31:59.777] grepl <- base::grepl [15:31:59.777] restarts <- computeRestarts(cond) [15:31:59.777] for (restart in restarts) { [15:31:59.777] name <- restart$name [15:31:59.777] if (is.null(name)) [15:31:59.777] next [15:31:59.777] if (!grepl(pattern, name)) [15:31:59.777] next [15:31:59.777] invokeRestart(restart) [15:31:59.777] muffled <- TRUE [15:31:59.777] break [15:31:59.777] } [15:31:59.777] } [15:31:59.777] } [15:31:59.777] invisible(muffled) [15:31:59.777] } [15:31:59.777] muffleCondition(cond, pattern = "^muffle") [15:31:59.777] } [15:31:59.777] } [15:31:59.777] else { [15:31:59.777] if (TRUE) { [15:31:59.777] muffleCondition <- function (cond, pattern = "^muffle") [15:31:59.777] { [15:31:59.777] inherits <- base::inherits [15:31:59.777] invokeRestart <- base::invokeRestart [15:31:59.777] is.null <- base::is.null [15:31:59.777] muffled <- FALSE [15:31:59.777] if (inherits(cond, "message")) { [15:31:59.777] muffled <- grepl(pattern, "muffleMessage") [15:31:59.777] if (muffled) [15:31:59.777] invokeRestart("muffleMessage") [15:31:59.777] } [15:31:59.777] else if (inherits(cond, "warning")) { [15:31:59.777] muffled <- grepl(pattern, "muffleWarning") [15:31:59.777] if (muffled) [15:31:59.777] invokeRestart("muffleWarning") [15:31:59.777] } [15:31:59.777] else if (inherits(cond, "condition")) { [15:31:59.777] if (!is.null(pattern)) { [15:31:59.777] computeRestarts <- base::computeRestarts [15:31:59.777] grepl <- base::grepl [15:31:59.777] restarts <- computeRestarts(cond) [15:31:59.777] for (restart in restarts) { [15:31:59.777] name <- restart$name [15:31:59.777] if (is.null(name)) [15:31:59.777] next [15:31:59.777] if (!grepl(pattern, name)) [15:31:59.777] next [15:31:59.777] invokeRestart(restart) [15:31:59.777] muffled <- TRUE [15:31:59.777] break [15:31:59.777] } [15:31:59.777] } [15:31:59.777] } [15:31:59.777] invisible(muffled) [15:31:59.777] } [15:31:59.777] muffleCondition(cond, pattern = "^muffle") [15:31:59.777] } [15:31:59.777] } [15:31:59.777] } [15:31:59.777] })) [15:31:59.777] }, error = function(ex) { [15:31:59.777] base::structure(base::list(value = NULL, visible = NULL, [15:31:59.777] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:59.777] ...future.rng), started = ...future.startTime, [15:31:59.777] finished = Sys.time(), session_uuid = NA_character_, [15:31:59.777] version = "1.8"), class = "FutureResult") [15:31:59.777] }, finally = { [15:31:59.777] if (!identical(...future.workdir, getwd())) [15:31:59.777] setwd(...future.workdir) [15:31:59.777] { [15:31:59.777] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:59.777] ...future.oldOptions$nwarnings <- NULL [15:31:59.777] } [15:31:59.777] base::options(...future.oldOptions) [15:31:59.777] if (.Platform$OS.type == "windows") { [15:31:59.777] old_names <- names(...future.oldEnvVars) [15:31:59.777] envs <- base::Sys.getenv() [15:31:59.777] names <- names(envs) [15:31:59.777] common <- intersect(names, old_names) [15:31:59.777] added <- setdiff(names, old_names) [15:31:59.777] removed <- setdiff(old_names, names) [15:31:59.777] changed <- common[...future.oldEnvVars[common] != [15:31:59.777] envs[common]] [15:31:59.777] NAMES <- toupper(changed) [15:31:59.777] args <- list() [15:31:59.777] for (kk in seq_along(NAMES)) { [15:31:59.777] name <- changed[[kk]] [15:31:59.777] NAME <- NAMES[[kk]] [15:31:59.777] if (name != NAME && is.element(NAME, old_names)) [15:31:59.777] next [15:31:59.777] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:59.777] } [15:31:59.777] NAMES <- toupper(added) [15:31:59.777] for (kk in seq_along(NAMES)) { [15:31:59.777] name <- added[[kk]] [15:31:59.777] NAME <- NAMES[[kk]] [15:31:59.777] if (name != NAME && is.element(NAME, old_names)) [15:31:59.777] next [15:31:59.777] args[[name]] <- "" [15:31:59.777] } [15:31:59.777] NAMES <- toupper(removed) [15:31:59.777] for (kk in seq_along(NAMES)) { [15:31:59.777] name <- removed[[kk]] [15:31:59.777] NAME <- NAMES[[kk]] [15:31:59.777] if (name != NAME && is.element(NAME, old_names)) [15:31:59.777] next [15:31:59.777] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:59.777] } [15:31:59.777] if (length(args) > 0) [15:31:59.777] base::do.call(base::Sys.setenv, args = args) [15:31:59.777] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:59.777] } [15:31:59.777] else { [15:31:59.777] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:59.777] } [15:31:59.777] { [15:31:59.777] if (base::length(...future.futureOptionsAdded) > [15:31:59.777] 0L) { [15:31:59.777] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:59.777] base::names(opts) <- ...future.futureOptionsAdded [15:31:59.777] base::options(opts) [15:31:59.777] } [15:31:59.777] { [15:31:59.777] { [15:31:59.777] base::options(mc.cores = ...future.mc.cores.old) [15:31:59.777] NULL [15:31:59.777] } [15:31:59.777] options(future.plan = NULL) [15:31:59.777] if (is.na(NA_character_)) [15:31:59.777] Sys.unsetenv("R_FUTURE_PLAN") [15:31:59.777] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:59.777] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:59.777] .init = FALSE) [15:31:59.777] } [15:31:59.777] } [15:31:59.777] } [15:31:59.777] }) [15:31:59.777] if (TRUE) { [15:31:59.777] base::sink(type = "output", split = FALSE) [15:31:59.777] if (TRUE) { [15:31:59.777] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:59.777] } [15:31:59.777] else { [15:31:59.777] ...future.result["stdout"] <- base::list(NULL) [15:31:59.777] } [15:31:59.777] base::close(...future.stdout) [15:31:59.777] ...future.stdout <- NULL [15:31:59.777] } [15:31:59.777] ...future.result$conditions <- ...future.conditions [15:31:59.777] ...future.result$finished <- base::Sys.time() [15:31:59.777] ...future.result [15:31:59.777] } [15:31:59.785] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:59.786] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:59.786] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:59.787] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:59.787] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:59.788] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... [15:31:59.788] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... DONE [15:31:59.789] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:59.789] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:59.790] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:59.791] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:59.791] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:59.792] MultisessionFuture started [15:31:59.792] - Launch lazy future ... done [15:31:59.792] run() for 'MultisessionFuture' ... done [15:31:59.793] Created future: [15:31:59.811] receiveMessageFromWorker() for ClusterFuture ... [15:31:59.811] - Validating connection of MultisessionFuture [15:31:59.812] - received message: FutureResult [15:31:59.812] - Received FutureResult [15:31:59.813] - Erased future from FutureRegistry [15:31:59.813] result() for ClusterFuture ... [15:31:59.813] - result already collected: FutureResult [15:31:59.814] result() for ClusterFuture ... done [15:31:59.814] receiveMessageFromWorker() for ClusterFuture ... done [15:31:59.793] MultisessionFuture: [15:31:59.793] Label: 'future_lapply-1' [15:31:59.793] Expression: [15:31:59.793] { [15:31:59.793] do.call(function(...) { [15:31:59.793] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:59.793] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:59.793] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:59.793] on.exit(options(oopts), add = TRUE) [15:31:59.793] } [15:31:59.793] { [15:31:59.793] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:59.793] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:59.793] ...future.FUN(...future.X_jj, ...) [15:31:59.793] }) [15:31:59.793] } [15:31:59.793] }, args = future.call.arguments) [15:31:59.793] } [15:31:59.793] Lazy evaluation: FALSE [15:31:59.793] Asynchronous evaluation: TRUE [15:31:59.793] Local evaluation: TRUE [15:31:59.793] Environment: R_GlobalEnv [15:31:59.793] Capture standard output: TRUE [15:31:59.793] Capture condition classes: 'condition' (excluding 'nothing') [15:31:59.793] Globals: 5 objects totaling 2.41 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 232 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:59.793] Packages: [15:31:59.793] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:59.793] Resolved: TRUE [15:31:59.793] Value: [15:31:59.793] Conditions captured: [15:31:59.793] Early signaling: FALSE [15:31:59.793] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:59.793] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:59.815] Chunk #1 of 2 ... DONE [15:31:59.815] Chunk #2 of 2 ... [15:31:59.815] - Finding globals in 'X' for chunk #2 ... [15:31:59.816] getGlobalsAndPackages() ... [15:31:59.816] Searching for globals... [15:31:59.817] [15:31:59.817] Searching for globals ... DONE [15:31:59.817] - globals: [0] [15:31:59.817] getGlobalsAndPackages() ... DONE [15:31:59.818] + additional globals found: [n=0] [15:31:59.818] + additional namespaces needed: [n=0] [15:31:59.818] - Finding globals in 'X' for chunk #2 ... DONE [15:31:59.819] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:59.819] - seeds: [15:31:59.819] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:59.819] getGlobalsAndPackages() ... [15:31:59.820] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:59.820] Resolving globals: FALSE [15:31:59.820] Tweak future expression to call with '...' arguments ... [15:31:59.821] { [15:31:59.821] do.call(function(...) { [15:31:59.821] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:59.821] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:59.821] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:59.821] on.exit(options(oopts), add = TRUE) [15:31:59.821] } [15:31:59.821] { [15:31:59.821] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:59.821] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:59.821] ...future.FUN(...future.X_jj, ...) [15:31:59.821] }) [15:31:59.821] } [15:31:59.821] }, args = future.call.arguments) [15:31:59.821] } [15:31:59.822] Tweak future expression to call with '...' arguments ... DONE [15:31:59.822] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:59.823] [15:31:59.823] getGlobalsAndPackages() ... DONE [15:31:59.824] run() for 'Future' ... [15:31:59.824] - state: 'created' [15:31:59.824] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:59.843] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:59.844] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:59.844] - Field: 'node' [15:31:59.844] - Field: 'label' [15:31:59.844] - Field: 'local' [15:31:59.844] - Field: 'owner' [15:31:59.845] - Field: 'envir' [15:31:59.845] - Field: 'workers' [15:31:59.845] - Field: 'packages' [15:31:59.845] - Field: 'gc' [15:31:59.845] - Field: 'conditions' [15:31:59.846] - Field: 'persistent' [15:31:59.846] - Field: 'expr' [15:31:59.846] - Field: 'uuid' [15:31:59.846] - Field: 'seed' [15:31:59.846] - Field: 'version' [15:31:59.846] - Field: 'result' [15:31:59.847] - Field: 'asynchronous' [15:31:59.847] - Field: 'calls' [15:31:59.847] - Field: 'globals' [15:31:59.847] - Field: 'stdout' [15:31:59.847] - Field: 'earlySignal' [15:31:59.848] - Field: 'lazy' [15:31:59.848] - Field: 'state' [15:31:59.848] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:59.848] - Launch lazy future ... [15:31:59.849] Packages needed by the future expression (n = 0): [15:31:59.849] Packages needed by future strategies (n = 0): [15:31:59.849] { [15:31:59.849] { [15:31:59.849] { [15:31:59.849] ...future.startTime <- base::Sys.time() [15:31:59.849] { [15:31:59.849] { [15:31:59.849] { [15:31:59.849] { [15:31:59.849] base::local({ [15:31:59.849] has_future <- base::requireNamespace("future", [15:31:59.849] quietly = TRUE) [15:31:59.849] if (has_future) { [15:31:59.849] ns <- base::getNamespace("future") [15:31:59.849] version <- ns[[".package"]][["version"]] [15:31:59.849] if (is.null(version)) [15:31:59.849] version <- utils::packageVersion("future") [15:31:59.849] } [15:31:59.849] else { [15:31:59.849] version <- NULL [15:31:59.849] } [15:31:59.849] if (!has_future || version < "1.8.0") { [15:31:59.849] info <- base::c(r_version = base::gsub("R version ", [15:31:59.849] "", base::R.version$version.string), [15:31:59.849] platform = base::sprintf("%s (%s-bit)", [15:31:59.849] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:59.849] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:59.849] "release", "version")], collapse = " "), [15:31:59.849] hostname = base::Sys.info()[["nodename"]]) [15:31:59.849] info <- base::sprintf("%s: %s", base::names(info), [15:31:59.849] info) [15:31:59.849] info <- base::paste(info, collapse = "; ") [15:31:59.849] if (!has_future) { [15:31:59.849] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:59.849] info) [15:31:59.849] } [15:31:59.849] else { [15:31:59.849] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:59.849] info, version) [15:31:59.849] } [15:31:59.849] base::stop(msg) [15:31:59.849] } [15:31:59.849] }) [15:31:59.849] } [15:31:59.849] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:59.849] base::options(mc.cores = 1L) [15:31:59.849] } [15:31:59.849] ...future.strategy.old <- future::plan("list") [15:31:59.849] options(future.plan = NULL) [15:31:59.849] Sys.unsetenv("R_FUTURE_PLAN") [15:31:59.849] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:59.849] } [15:31:59.849] ...future.workdir <- getwd() [15:31:59.849] } [15:31:59.849] ...future.oldOptions <- base::as.list(base::.Options) [15:31:59.849] ...future.oldEnvVars <- base::Sys.getenv() [15:31:59.849] } [15:31:59.849] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:59.849] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:59.849] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:59.849] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:59.849] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:59.849] future.stdout.windows.reencode = NULL, width = 80L) [15:31:59.849] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:59.849] base::names(...future.oldOptions)) [15:31:59.849] } [15:31:59.849] if (FALSE) { [15:31:59.849] } [15:31:59.849] else { [15:31:59.849] if (TRUE) { [15:31:59.849] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:59.849] open = "w") [15:31:59.849] } [15:31:59.849] else { [15:31:59.849] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:59.849] windows = "NUL", "/dev/null"), open = "w") [15:31:59.849] } [15:31:59.849] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:59.849] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:59.849] base::sink(type = "output", split = FALSE) [15:31:59.849] base::close(...future.stdout) [15:31:59.849] }, add = TRUE) [15:31:59.849] } [15:31:59.849] ...future.frame <- base::sys.nframe() [15:31:59.849] ...future.conditions <- base::list() [15:31:59.849] ...future.rng <- base::globalenv()$.Random.seed [15:31:59.849] if (FALSE) { [15:31:59.849] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:59.849] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:59.849] } [15:31:59.849] ...future.result <- base::tryCatch({ [15:31:59.849] base::withCallingHandlers({ [15:31:59.849] ...future.value <- base::withVisible(base::local({ [15:31:59.849] ...future.makeSendCondition <- base::local({ [15:31:59.849] sendCondition <- NULL [15:31:59.849] function(frame = 1L) { [15:31:59.849] if (is.function(sendCondition)) [15:31:59.849] return(sendCondition) [15:31:59.849] ns <- getNamespace("parallel") [15:31:59.849] if (exists("sendData", mode = "function", [15:31:59.849] envir = ns)) { [15:31:59.849] parallel_sendData <- get("sendData", mode = "function", [15:31:59.849] envir = ns) [15:31:59.849] envir <- sys.frame(frame) [15:31:59.849] master <- NULL [15:31:59.849] while (!identical(envir, .GlobalEnv) && [15:31:59.849] !identical(envir, emptyenv())) { [15:31:59.849] if (exists("master", mode = "list", envir = envir, [15:31:59.849] inherits = FALSE)) { [15:31:59.849] master <- get("master", mode = "list", [15:31:59.849] envir = envir, inherits = FALSE) [15:31:59.849] if (inherits(master, c("SOCKnode", [15:31:59.849] "SOCK0node"))) { [15:31:59.849] sendCondition <<- function(cond) { [15:31:59.849] data <- list(type = "VALUE", value = cond, [15:31:59.849] success = TRUE) [15:31:59.849] parallel_sendData(master, data) [15:31:59.849] } [15:31:59.849] return(sendCondition) [15:31:59.849] } [15:31:59.849] } [15:31:59.849] frame <- frame + 1L [15:31:59.849] envir <- sys.frame(frame) [15:31:59.849] } [15:31:59.849] } [15:31:59.849] sendCondition <<- function(cond) NULL [15:31:59.849] } [15:31:59.849] }) [15:31:59.849] withCallingHandlers({ [15:31:59.849] { [15:31:59.849] do.call(function(...) { [15:31:59.849] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:59.849] if (!identical(...future.globals.maxSize.org, [15:31:59.849] ...future.globals.maxSize)) { [15:31:59.849] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:59.849] on.exit(options(oopts), add = TRUE) [15:31:59.849] } [15:31:59.849] { [15:31:59.849] lapply(seq_along(...future.elements_ii), [15:31:59.849] FUN = function(jj) { [15:31:59.849] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:59.849] ...future.FUN(...future.X_jj, ...) [15:31:59.849] }) [15:31:59.849] } [15:31:59.849] }, args = future.call.arguments) [15:31:59.849] } [15:31:59.849] }, immediateCondition = function(cond) { [15:31:59.849] sendCondition <- ...future.makeSendCondition() [15:31:59.849] sendCondition(cond) [15:31:59.849] muffleCondition <- function (cond, pattern = "^muffle") [15:31:59.849] { [15:31:59.849] inherits <- base::inherits [15:31:59.849] invokeRestart <- base::invokeRestart [15:31:59.849] is.null <- base::is.null [15:31:59.849] muffled <- FALSE [15:31:59.849] if (inherits(cond, "message")) { [15:31:59.849] muffled <- grepl(pattern, "muffleMessage") [15:31:59.849] if (muffled) [15:31:59.849] invokeRestart("muffleMessage") [15:31:59.849] } [15:31:59.849] else if (inherits(cond, "warning")) { [15:31:59.849] muffled <- grepl(pattern, "muffleWarning") [15:31:59.849] if (muffled) [15:31:59.849] invokeRestart("muffleWarning") [15:31:59.849] } [15:31:59.849] else if (inherits(cond, "condition")) { [15:31:59.849] if (!is.null(pattern)) { [15:31:59.849] computeRestarts <- base::computeRestarts [15:31:59.849] grepl <- base::grepl [15:31:59.849] restarts <- computeRestarts(cond) [15:31:59.849] for (restart in restarts) { [15:31:59.849] name <- restart$name [15:31:59.849] if (is.null(name)) [15:31:59.849] next [15:31:59.849] if (!grepl(pattern, name)) [15:31:59.849] next [15:31:59.849] invokeRestart(restart) [15:31:59.849] muffled <- TRUE [15:31:59.849] break [15:31:59.849] } [15:31:59.849] } [15:31:59.849] } [15:31:59.849] invisible(muffled) [15:31:59.849] } [15:31:59.849] muffleCondition(cond) [15:31:59.849] }) [15:31:59.849] })) [15:31:59.849] future::FutureResult(value = ...future.value$value, [15:31:59.849] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:59.849] ...future.rng), globalenv = if (FALSE) [15:31:59.849] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:59.849] ...future.globalenv.names)) [15:31:59.849] else NULL, started = ...future.startTime, version = "1.8") [15:31:59.849] }, condition = base::local({ [15:31:59.849] c <- base::c [15:31:59.849] inherits <- base::inherits [15:31:59.849] invokeRestart <- base::invokeRestart [15:31:59.849] length <- base::length [15:31:59.849] list <- base::list [15:31:59.849] seq.int <- base::seq.int [15:31:59.849] signalCondition <- base::signalCondition [15:31:59.849] sys.calls <- base::sys.calls [15:31:59.849] `[[` <- base::`[[` [15:31:59.849] `+` <- base::`+` [15:31:59.849] `<<-` <- base::`<<-` [15:31:59.849] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:59.849] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:59.849] 3L)] [15:31:59.849] } [15:31:59.849] function(cond) { [15:31:59.849] is_error <- inherits(cond, "error") [15:31:59.849] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:59.849] NULL) [15:31:59.849] if (is_error) { [15:31:59.849] sessionInformation <- function() { [15:31:59.849] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:59.849] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:59.849] search = base::search(), system = base::Sys.info()) [15:31:59.849] } [15:31:59.849] ...future.conditions[[length(...future.conditions) + [15:31:59.849] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:59.849] cond$call), session = sessionInformation(), [15:31:59.849] timestamp = base::Sys.time(), signaled = 0L) [15:31:59.849] signalCondition(cond) [15:31:59.849] } [15:31:59.849] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:59.849] "immediateCondition"))) { [15:31:59.849] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:59.849] ...future.conditions[[length(...future.conditions) + [15:31:59.849] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:59.849] if (TRUE && !signal) { [15:31:59.849] muffleCondition <- function (cond, pattern = "^muffle") [15:31:59.849] { [15:31:59.849] inherits <- base::inherits [15:31:59.849] invokeRestart <- base::invokeRestart [15:31:59.849] is.null <- base::is.null [15:31:59.849] muffled <- FALSE [15:31:59.849] if (inherits(cond, "message")) { [15:31:59.849] muffled <- grepl(pattern, "muffleMessage") [15:31:59.849] if (muffled) [15:31:59.849] invokeRestart("muffleMessage") [15:31:59.849] } [15:31:59.849] else if (inherits(cond, "warning")) { [15:31:59.849] muffled <- grepl(pattern, "muffleWarning") [15:31:59.849] if (muffled) [15:31:59.849] invokeRestart("muffleWarning") [15:31:59.849] } [15:31:59.849] else if (inherits(cond, "condition")) { [15:31:59.849] if (!is.null(pattern)) { [15:31:59.849] computeRestarts <- base::computeRestarts [15:31:59.849] grepl <- base::grepl [15:31:59.849] restarts <- computeRestarts(cond) [15:31:59.849] for (restart in restarts) { [15:31:59.849] name <- restart$name [15:31:59.849] if (is.null(name)) [15:31:59.849] next [15:31:59.849] if (!grepl(pattern, name)) [15:31:59.849] next [15:31:59.849] invokeRestart(restart) [15:31:59.849] muffled <- TRUE [15:31:59.849] break [15:31:59.849] } [15:31:59.849] } [15:31:59.849] } [15:31:59.849] invisible(muffled) [15:31:59.849] } [15:31:59.849] muffleCondition(cond, pattern = "^muffle") [15:31:59.849] } [15:31:59.849] } [15:31:59.849] else { [15:31:59.849] if (TRUE) { [15:31:59.849] muffleCondition <- function (cond, pattern = "^muffle") [15:31:59.849] { [15:31:59.849] inherits <- base::inherits [15:31:59.849] invokeRestart <- base::invokeRestart [15:31:59.849] is.null <- base::is.null [15:31:59.849] muffled <- FALSE [15:31:59.849] if (inherits(cond, "message")) { [15:31:59.849] muffled <- grepl(pattern, "muffleMessage") [15:31:59.849] if (muffled) [15:31:59.849] invokeRestart("muffleMessage") [15:31:59.849] } [15:31:59.849] else if (inherits(cond, "warning")) { [15:31:59.849] muffled <- grepl(pattern, "muffleWarning") [15:31:59.849] if (muffled) [15:31:59.849] invokeRestart("muffleWarning") [15:31:59.849] } [15:31:59.849] else if (inherits(cond, "condition")) { [15:31:59.849] if (!is.null(pattern)) { [15:31:59.849] computeRestarts <- base::computeRestarts [15:31:59.849] grepl <- base::grepl [15:31:59.849] restarts <- computeRestarts(cond) [15:31:59.849] for (restart in restarts) { [15:31:59.849] name <- restart$name [15:31:59.849] if (is.null(name)) [15:31:59.849] next [15:31:59.849] if (!grepl(pattern, name)) [15:31:59.849] next [15:31:59.849] invokeRestart(restart) [15:31:59.849] muffled <- TRUE [15:31:59.849] break [15:31:59.849] } [15:31:59.849] } [15:31:59.849] } [15:31:59.849] invisible(muffled) [15:31:59.849] } [15:31:59.849] muffleCondition(cond, pattern = "^muffle") [15:31:59.849] } [15:31:59.849] } [15:31:59.849] } [15:31:59.849] })) [15:31:59.849] }, error = function(ex) { [15:31:59.849] base::structure(base::list(value = NULL, visible = NULL, [15:31:59.849] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:59.849] ...future.rng), started = ...future.startTime, [15:31:59.849] finished = Sys.time(), session_uuid = NA_character_, [15:31:59.849] version = "1.8"), class = "FutureResult") [15:31:59.849] }, finally = { [15:31:59.849] if (!identical(...future.workdir, getwd())) [15:31:59.849] setwd(...future.workdir) [15:31:59.849] { [15:31:59.849] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:59.849] ...future.oldOptions$nwarnings <- NULL [15:31:59.849] } [15:31:59.849] base::options(...future.oldOptions) [15:31:59.849] if (.Platform$OS.type == "windows") { [15:31:59.849] old_names <- names(...future.oldEnvVars) [15:31:59.849] envs <- base::Sys.getenv() [15:31:59.849] names <- names(envs) [15:31:59.849] common <- intersect(names, old_names) [15:31:59.849] added <- setdiff(names, old_names) [15:31:59.849] removed <- setdiff(old_names, names) [15:31:59.849] changed <- common[...future.oldEnvVars[common] != [15:31:59.849] envs[common]] [15:31:59.849] NAMES <- toupper(changed) [15:31:59.849] args <- list() [15:31:59.849] for (kk in seq_along(NAMES)) { [15:31:59.849] name <- changed[[kk]] [15:31:59.849] NAME <- NAMES[[kk]] [15:31:59.849] if (name != NAME && is.element(NAME, old_names)) [15:31:59.849] next [15:31:59.849] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:59.849] } [15:31:59.849] NAMES <- toupper(added) [15:31:59.849] for (kk in seq_along(NAMES)) { [15:31:59.849] name <- added[[kk]] [15:31:59.849] NAME <- NAMES[[kk]] [15:31:59.849] if (name != NAME && is.element(NAME, old_names)) [15:31:59.849] next [15:31:59.849] args[[name]] <- "" [15:31:59.849] } [15:31:59.849] NAMES <- toupper(removed) [15:31:59.849] for (kk in seq_along(NAMES)) { [15:31:59.849] name <- removed[[kk]] [15:31:59.849] NAME <- NAMES[[kk]] [15:31:59.849] if (name != NAME && is.element(NAME, old_names)) [15:31:59.849] next [15:31:59.849] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:59.849] } [15:31:59.849] if (length(args) > 0) [15:31:59.849] base::do.call(base::Sys.setenv, args = args) [15:31:59.849] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:59.849] } [15:31:59.849] else { [15:31:59.849] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:59.849] } [15:31:59.849] { [15:31:59.849] if (base::length(...future.futureOptionsAdded) > [15:31:59.849] 0L) { [15:31:59.849] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:59.849] base::names(opts) <- ...future.futureOptionsAdded [15:31:59.849] base::options(opts) [15:31:59.849] } [15:31:59.849] { [15:31:59.849] { [15:31:59.849] base::options(mc.cores = ...future.mc.cores.old) [15:31:59.849] NULL [15:31:59.849] } [15:31:59.849] options(future.plan = NULL) [15:31:59.849] if (is.na(NA_character_)) [15:31:59.849] Sys.unsetenv("R_FUTURE_PLAN") [15:31:59.849] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:59.849] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:59.849] .init = FALSE) [15:31:59.849] } [15:31:59.849] } [15:31:59.849] } [15:31:59.849] }) [15:31:59.849] if (TRUE) { [15:31:59.849] base::sink(type = "output", split = FALSE) [15:31:59.849] if (TRUE) { [15:31:59.849] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:59.849] } [15:31:59.849] else { [15:31:59.849] ...future.result["stdout"] <- base::list(NULL) [15:31:59.849] } [15:31:59.849] base::close(...future.stdout) [15:31:59.849] ...future.stdout <- NULL [15:31:59.849] } [15:31:59.849] ...future.result$conditions <- ...future.conditions [15:31:59.849] ...future.result$finished <- base::Sys.time() [15:31:59.849] ...future.result [15:31:59.849] } [15:31:59.856] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:59.856] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:59.856] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:59.857] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:59.858] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:59.858] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... [15:31:59.859] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... DONE [15:31:59.859] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:59.860] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:59.860] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:59.861] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:59.861] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:59.863] MultisessionFuture started [15:31:59.863] - Launch lazy future ... done [15:31:59.863] run() for 'MultisessionFuture' ... done [15:31:59.864] Created future: [15:31:59.889] receiveMessageFromWorker() for ClusterFuture ... [15:31:59.889] - Validating connection of MultisessionFuture [15:31:59.890] - received message: FutureResult [15:31:59.890] - Received FutureResult [15:31:59.890] - Erased future from FutureRegistry [15:31:59.890] result() for ClusterFuture ... [15:31:59.890] - result already collected: FutureResult [15:31:59.891] result() for ClusterFuture ... done [15:31:59.891] receiveMessageFromWorker() for ClusterFuture ... done [15:31:59.864] MultisessionFuture: [15:31:59.864] Label: 'future_lapply-2' [15:31:59.864] Expression: [15:31:59.864] { [15:31:59.864] do.call(function(...) { [15:31:59.864] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:59.864] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:59.864] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:59.864] on.exit(options(oopts), add = TRUE) [15:31:59.864] } [15:31:59.864] { [15:31:59.864] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:59.864] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:59.864] ...future.FUN(...future.X_jj, ...) [15:31:59.864] }) [15:31:59.864] } [15:31:59.864] }, args = future.call.arguments) [15:31:59.864] } [15:31:59.864] Lazy evaluation: FALSE [15:31:59.864] Asynchronous evaluation: TRUE [15:31:59.864] Local evaluation: TRUE [15:31:59.864] Environment: R_GlobalEnv [15:31:59.864] Capture standard output: TRUE [15:31:59.864] Capture condition classes: 'condition' (excluding 'nothing') [15:31:59.864] Globals: 5 objects totaling 2.41 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 224 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:59.864] Packages: [15:31:59.864] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:59.864] Resolved: TRUE [15:31:59.864] Value: [15:31:59.864] Conditions captured: [15:31:59.864] Early signaling: FALSE [15:31:59.864] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:59.864] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:59.891] Chunk #2 of 2 ... DONE [15:31:59.892] Launching 2 futures (chunks) ... DONE [15:31:59.892] Resolving 2 futures (chunks) ... [15:31:59.892] resolve() on list ... [15:31:59.892] recursive: 0 [15:31:59.892] length: 2 [15:31:59.892] [15:31:59.893] Future #1 [15:31:59.893] result() for ClusterFuture ... [15:31:59.893] - result already collected: FutureResult [15:31:59.893] result() for ClusterFuture ... done [15:31:59.893] result() for ClusterFuture ... [15:31:59.893] - result already collected: FutureResult [15:31:59.894] result() for ClusterFuture ... done [15:31:59.894] signalConditionsASAP(MultisessionFuture, pos=1) ... [15:31:59.894] - nx: 2 [15:31:59.894] - relay: TRUE [15:31:59.894] - stdout: TRUE [15:31:59.894] - signal: TRUE [15:31:59.895] - resignal: FALSE [15:31:59.895] - force: TRUE [15:31:59.895] - relayed: [n=2] FALSE, FALSE [15:31:59.895] - queued futures: [n=2] FALSE, FALSE [15:31:59.895] - until=1 [15:31:59.895] - relaying element #1 [15:31:59.896] result() for ClusterFuture ... [15:31:59.896] - result already collected: FutureResult [15:31:59.896] result() for ClusterFuture ... done [15:31:59.896] result() for ClusterFuture ... [15:31:59.896] - result already collected: FutureResult [15:31:59.896] result() for ClusterFuture ... done [15:31:59.897] result() for ClusterFuture ... [15:31:59.897] - result already collected: FutureResult [15:31:59.897] result() for ClusterFuture ... done [15:31:59.897] result() for ClusterFuture ... [15:31:59.897] - result already collected: FutureResult [15:31:59.897] result() for ClusterFuture ... done [15:31:59.898] - relayed: [n=2] TRUE, FALSE [15:31:59.898] - queued futures: [n=2] TRUE, FALSE [15:31:59.898] signalConditionsASAP(MultisessionFuture, pos=1) ... done [15:31:59.898] length: 1 (resolved future 1) [15:31:59.898] Future #2 [15:31:59.899] result() for ClusterFuture ... [15:31:59.899] - result already collected: FutureResult [15:31:59.899] result() for ClusterFuture ... done [15:31:59.899] result() for ClusterFuture ... [15:31:59.899] - result already collected: FutureResult [15:31:59.899] result() for ClusterFuture ... done [15:31:59.900] signalConditionsASAP(MultisessionFuture, pos=2) ... [15:31:59.900] - nx: 2 [15:31:59.900] - relay: TRUE [15:31:59.900] - stdout: TRUE [15:31:59.900] - signal: TRUE [15:31:59.900] - resignal: FALSE [15:31:59.900] - force: TRUE [15:31:59.901] - relayed: [n=2] TRUE, FALSE [15:31:59.901] - queued futures: [n=2] TRUE, FALSE [15:31:59.901] - until=2 [15:31:59.901] - relaying element #2 [15:31:59.901] result() for ClusterFuture ... [15:31:59.901] - result already collected: FutureResult [15:31:59.902] result() for ClusterFuture ... done [15:31:59.902] result() for ClusterFuture ... [15:31:59.902] - result already collected: FutureResult [15:31:59.902] result() for ClusterFuture ... done [15:31:59.902] result() for ClusterFuture ... [15:31:59.902] - result already collected: FutureResult [15:31:59.903] result() for ClusterFuture ... done [15:31:59.903] result() for ClusterFuture ... [15:31:59.903] - result already collected: FutureResult [15:31:59.903] result() for ClusterFuture ... done [15:31:59.903] - relayed: [n=2] TRUE, TRUE [15:31:59.903] - queued futures: [n=2] TRUE, TRUE [15:31:59.904] signalConditionsASAP(MultisessionFuture, pos=2) ... done [15:31:59.904] length: 0 (resolved future 2) [15:31:59.904] Relaying remaining futures [15:31:59.904] signalConditionsASAP(NULL, pos=0) ... [15:31:59.904] - nx: 2 [15:31:59.904] - relay: TRUE [15:31:59.905] - stdout: TRUE [15:31:59.905] - signal: TRUE [15:31:59.905] - resignal: FALSE [15:31:59.905] - force: TRUE [15:31:59.906] - relayed: [n=2] TRUE, TRUE [15:31:59.906] - queued futures: [n=2] TRUE, TRUE - flush all [15:31:59.906] - relayed: [n=2] TRUE, TRUE [15:31:59.907] - queued futures: [n=2] TRUE, TRUE [15:31:59.907] signalConditionsASAP(NULL, pos=0) ... done [15:31:59.907] resolve() on list ... DONE [15:31:59.907] result() for ClusterFuture ... [15:31:59.908] - result already collected: FutureResult [15:31:59.908] result() for ClusterFuture ... done [15:31:59.908] result() for ClusterFuture ... [15:31:59.909] - result already collected: FutureResult [15:31:59.909] result() for ClusterFuture ... done [15:31:59.909] result() for ClusterFuture ... [15:31:59.909] - result already collected: FutureResult [15:31:59.909] result() for ClusterFuture ... done [15:31:59.909] result() for ClusterFuture ... [15:31:59.910] - result already collected: FutureResult [15:31:59.910] result() for ClusterFuture ... done [15:31:59.910] - Number of value chunks collected: 2 [15:31:59.910] Resolving 2 futures (chunks) ... DONE [15:31:59.910] Reducing values from 2 chunks ... [15:31:59.911] - Number of values collected after concatenation: 4 [15:31:59.911] - Number of values expected: 4 [15:31:59.911] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [15:31:59.912] Reducing values from 2 chunks ... DONE [15:31:59.912] 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, ...) ... [15:31:59.915] future_lapply() ... [15:31:59.918] Number of chunks: 2 [15:31:59.919] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [15:31:59.919] getGlobalsAndPackagesXApply() ... [15:31:59.919] - future.globals: TRUE [15:31:59.919] getGlobalsAndPackages() ... [15:31:59.919] Searching for globals... [15:31:59.921] - globals found: [2] 'FUN', '.Internal' [15:31:59.921] Searching for globals ... DONE [15:31:59.921] Resolving globals: FALSE [15:31:59.922] The total size of the 1 globals is 2.13 KiB (2184 bytes) [15:31:59.922] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 2.13 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (2.13 KiB of class 'function') [15:31:59.923] - globals: [1] 'FUN' [15:31:59.923] [15:31:59.923] getGlobalsAndPackages() ... DONE [15:31:59.923] - globals found/used: [n=1] 'FUN' [15:31:59.923] - needed namespaces: [n=0] [15:31:59.924] Finding globals ... DONE [15:31:59.924] - use_args: TRUE [15:31:59.924] - Getting '...' globals ... [15:31:59.924] resolve() on list ... [15:31:59.925] recursive: 0 [15:31:59.925] length: 1 [15:31:59.925] elements: '...' [15:31:59.925] length: 0 (resolved future 1) [15:31:59.925] resolve() on list ... DONE [15:31:59.926] - '...' content: [n=1] 'length' [15:31:59.926] List of 1 [15:31:59.926] $ ...:List of 1 [15:31:59.926] ..$ length: int 2 [15:31:59.926] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:59.926] - attr(*, "where")=List of 1 [15:31:59.926] ..$ ...: [15:31:59.926] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:59.926] - attr(*, "resolved")= logi TRUE [15:31:59.926] - attr(*, "total_size")= num NA [15:31:59.929] - Getting '...' globals ... DONE [15:31:59.930] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:31:59.930] List of 2 [15:31:59.930] $ ...future.FUN:function (mode = "logical", length = 0L) [15:31:59.930] $ ... :List of 1 [15:31:59.930] ..$ length: int 2 [15:31:59.930] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:31:59.930] - attr(*, "where")=List of 2 [15:31:59.930] ..$ ...future.FUN: [15:31:59.930] ..$ ... : [15:31:59.930] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:31:59.930] - attr(*, "resolved")= logi FALSE [15:31:59.930] - attr(*, "total_size")= num 2240 [15:31:59.934] Packages to be attached in all futures: [n=0] [15:31:59.934] getGlobalsAndPackagesXApply() ... DONE [15:31:59.935] Number of futures (= number of chunks): 2 [15:31:59.935] Launching 2 futures (chunks) ... [15:31:59.935] Chunk #1 of 2 ... [15:31:59.935] - Finding globals in 'X' for chunk #1 ... [15:31:59.935] getGlobalsAndPackages() ... [15:31:59.936] Searching for globals... [15:31:59.936] [15:31:59.936] Searching for globals ... DONE [15:31:59.936] - globals: [0] [15:31:59.936] getGlobalsAndPackages() ... DONE [15:31:59.937] + additional globals found: [n=0] [15:31:59.937] + additional namespaces needed: [n=0] [15:31:59.937] - Finding globals in 'X' for chunk #1 ... DONE [15:31:59.937] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:31:59.937] - seeds: [15:31:59.938] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:59.938] getGlobalsAndPackages() ... [15:31:59.938] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:59.938] Resolving globals: FALSE [15:31:59.938] Tweak future expression to call with '...' arguments ... [15:31:59.938] { [15:31:59.938] do.call(function(...) { [15:31:59.938] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:59.938] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:59.938] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:59.938] on.exit(options(oopts), add = TRUE) [15:31:59.938] } [15:31:59.938] { [15:31:59.938] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:59.938] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:59.938] ...future.FUN(...future.X_jj, ...) [15:31:59.938] }) [15:31:59.938] } [15:31:59.938] }, args = future.call.arguments) [15:31:59.938] } [15:31:59.939] Tweak future expression to call with '...' arguments ... DONE [15:31:59.940] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:31:59.940] [15:31:59.940] getGlobalsAndPackages() ... DONE [15:31:59.940] run() for 'Future' ... [15:31:59.941] - state: 'created' [15:31:59.941] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:31:59.956] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:59.957] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:31:59.957] - Field: 'node' [15:31:59.957] - Field: 'label' [15:31:59.957] - Field: 'local' [15:31:59.957] - Field: 'owner' [15:31:59.958] - Field: 'envir' [15:31:59.958] - Field: 'workers' [15:31:59.958] - Field: 'packages' [15:31:59.958] - Field: 'gc' [15:31:59.958] - Field: 'conditions' [15:31:59.959] - Field: 'persistent' [15:31:59.959] - Field: 'expr' [15:31:59.959] - Field: 'uuid' [15:31:59.959] - Field: 'seed' [15:31:59.959] - Field: 'version' [15:31:59.959] - Field: 'result' [15:31:59.960] - Field: 'asynchronous' [15:31:59.960] - Field: 'calls' [15:31:59.960] - Field: 'globals' [15:31:59.960] - Field: 'stdout' [15:31:59.960] - Field: 'earlySignal' [15:31:59.961] - Field: 'lazy' [15:31:59.961] - Field: 'state' [15:31:59.961] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:31:59.961] - Launch lazy future ... [15:31:59.964] Packages needed by the future expression (n = 0): [15:31:59.965] Packages needed by future strategies (n = 0): [15:31:59.965] { [15:31:59.965] { [15:31:59.965] { [15:31:59.965] ...future.startTime <- base::Sys.time() [15:31:59.965] { [15:31:59.965] { [15:31:59.965] { [15:31:59.965] { [15:31:59.965] base::local({ [15:31:59.965] has_future <- base::requireNamespace("future", [15:31:59.965] quietly = TRUE) [15:31:59.965] if (has_future) { [15:31:59.965] ns <- base::getNamespace("future") [15:31:59.965] version <- ns[[".package"]][["version"]] [15:31:59.965] if (is.null(version)) [15:31:59.965] version <- utils::packageVersion("future") [15:31:59.965] } [15:31:59.965] else { [15:31:59.965] version <- NULL [15:31:59.965] } [15:31:59.965] if (!has_future || version < "1.8.0") { [15:31:59.965] info <- base::c(r_version = base::gsub("R version ", [15:31:59.965] "", base::R.version$version.string), [15:31:59.965] platform = base::sprintf("%s (%s-bit)", [15:31:59.965] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:31:59.965] os = base::paste(base::Sys.info()[base::c("sysname", [15:31:59.965] "release", "version")], collapse = " "), [15:31:59.965] hostname = base::Sys.info()[["nodename"]]) [15:31:59.965] info <- base::sprintf("%s: %s", base::names(info), [15:31:59.965] info) [15:31:59.965] info <- base::paste(info, collapse = "; ") [15:31:59.965] if (!has_future) { [15:31:59.965] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:31:59.965] info) [15:31:59.965] } [15:31:59.965] else { [15:31:59.965] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:31:59.965] info, version) [15:31:59.965] } [15:31:59.965] base::stop(msg) [15:31:59.965] } [15:31:59.965] }) [15:31:59.965] } [15:31:59.965] ...future.mc.cores.old <- base::getOption("mc.cores") [15:31:59.965] base::options(mc.cores = 1L) [15:31:59.965] } [15:31:59.965] ...future.strategy.old <- future::plan("list") [15:31:59.965] options(future.plan = NULL) [15:31:59.965] Sys.unsetenv("R_FUTURE_PLAN") [15:31:59.965] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:31:59.965] } [15:31:59.965] ...future.workdir <- getwd() [15:31:59.965] } [15:31:59.965] ...future.oldOptions <- base::as.list(base::.Options) [15:31:59.965] ...future.oldEnvVars <- base::Sys.getenv() [15:31:59.965] } [15:31:59.965] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:31:59.965] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:31:59.965] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:31:59.965] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:31:59.965] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:31:59.965] future.stdout.windows.reencode = NULL, width = 80L) [15:31:59.965] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:31:59.965] base::names(...future.oldOptions)) [15:31:59.965] } [15:31:59.965] if (FALSE) { [15:31:59.965] } [15:31:59.965] else { [15:31:59.965] if (TRUE) { [15:31:59.965] ...future.stdout <- base::rawConnection(base::raw(0L), [15:31:59.965] open = "w") [15:31:59.965] } [15:31:59.965] else { [15:31:59.965] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:31:59.965] windows = "NUL", "/dev/null"), open = "w") [15:31:59.965] } [15:31:59.965] base::sink(...future.stdout, type = "output", split = FALSE) [15:31:59.965] base::on.exit(if (!base::is.null(...future.stdout)) { [15:31:59.965] base::sink(type = "output", split = FALSE) [15:31:59.965] base::close(...future.stdout) [15:31:59.965] }, add = TRUE) [15:31:59.965] } [15:31:59.965] ...future.frame <- base::sys.nframe() [15:31:59.965] ...future.conditions <- base::list() [15:31:59.965] ...future.rng <- base::globalenv()$.Random.seed [15:31:59.965] if (FALSE) { [15:31:59.965] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:31:59.965] "...future.value", "...future.globalenv.names", ".Random.seed") [15:31:59.965] } [15:31:59.965] ...future.result <- base::tryCatch({ [15:31:59.965] base::withCallingHandlers({ [15:31:59.965] ...future.value <- base::withVisible(base::local({ [15:31:59.965] ...future.makeSendCondition <- base::local({ [15:31:59.965] sendCondition <- NULL [15:31:59.965] function(frame = 1L) { [15:31:59.965] if (is.function(sendCondition)) [15:31:59.965] return(sendCondition) [15:31:59.965] ns <- getNamespace("parallel") [15:31:59.965] if (exists("sendData", mode = "function", [15:31:59.965] envir = ns)) { [15:31:59.965] parallel_sendData <- get("sendData", mode = "function", [15:31:59.965] envir = ns) [15:31:59.965] envir <- sys.frame(frame) [15:31:59.965] master <- NULL [15:31:59.965] while (!identical(envir, .GlobalEnv) && [15:31:59.965] !identical(envir, emptyenv())) { [15:31:59.965] if (exists("master", mode = "list", envir = envir, [15:31:59.965] inherits = FALSE)) { [15:31:59.965] master <- get("master", mode = "list", [15:31:59.965] envir = envir, inherits = FALSE) [15:31:59.965] if (inherits(master, c("SOCKnode", [15:31:59.965] "SOCK0node"))) { [15:31:59.965] sendCondition <<- function(cond) { [15:31:59.965] data <- list(type = "VALUE", value = cond, [15:31:59.965] success = TRUE) [15:31:59.965] parallel_sendData(master, data) [15:31:59.965] } [15:31:59.965] return(sendCondition) [15:31:59.965] } [15:31:59.965] } [15:31:59.965] frame <- frame + 1L [15:31:59.965] envir <- sys.frame(frame) [15:31:59.965] } [15:31:59.965] } [15:31:59.965] sendCondition <<- function(cond) NULL [15:31:59.965] } [15:31:59.965] }) [15:31:59.965] withCallingHandlers({ [15:31:59.965] { [15:31:59.965] do.call(function(...) { [15:31:59.965] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:59.965] if (!identical(...future.globals.maxSize.org, [15:31:59.965] ...future.globals.maxSize)) { [15:31:59.965] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:59.965] on.exit(options(oopts), add = TRUE) [15:31:59.965] } [15:31:59.965] { [15:31:59.965] lapply(seq_along(...future.elements_ii), [15:31:59.965] FUN = function(jj) { [15:31:59.965] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:59.965] ...future.FUN(...future.X_jj, ...) [15:31:59.965] }) [15:31:59.965] } [15:31:59.965] }, args = future.call.arguments) [15:31:59.965] } [15:31:59.965] }, immediateCondition = function(cond) { [15:31:59.965] sendCondition <- ...future.makeSendCondition() [15:31:59.965] sendCondition(cond) [15:31:59.965] muffleCondition <- function (cond, pattern = "^muffle") [15:31:59.965] { [15:31:59.965] inherits <- base::inherits [15:31:59.965] invokeRestart <- base::invokeRestart [15:31:59.965] is.null <- base::is.null [15:31:59.965] muffled <- FALSE [15:31:59.965] if (inherits(cond, "message")) { [15:31:59.965] muffled <- grepl(pattern, "muffleMessage") [15:31:59.965] if (muffled) [15:31:59.965] invokeRestart("muffleMessage") [15:31:59.965] } [15:31:59.965] else if (inherits(cond, "warning")) { [15:31:59.965] muffled <- grepl(pattern, "muffleWarning") [15:31:59.965] if (muffled) [15:31:59.965] invokeRestart("muffleWarning") [15:31:59.965] } [15:31:59.965] else if (inherits(cond, "condition")) { [15:31:59.965] if (!is.null(pattern)) { [15:31:59.965] computeRestarts <- base::computeRestarts [15:31:59.965] grepl <- base::grepl [15:31:59.965] restarts <- computeRestarts(cond) [15:31:59.965] for (restart in restarts) { [15:31:59.965] name <- restart$name [15:31:59.965] if (is.null(name)) [15:31:59.965] next [15:31:59.965] if (!grepl(pattern, name)) [15:31:59.965] next [15:31:59.965] invokeRestart(restart) [15:31:59.965] muffled <- TRUE [15:31:59.965] break [15:31:59.965] } [15:31:59.965] } [15:31:59.965] } [15:31:59.965] invisible(muffled) [15:31:59.965] } [15:31:59.965] muffleCondition(cond) [15:31:59.965] }) [15:31:59.965] })) [15:31:59.965] future::FutureResult(value = ...future.value$value, [15:31:59.965] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:31:59.965] ...future.rng), globalenv = if (FALSE) [15:31:59.965] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:31:59.965] ...future.globalenv.names)) [15:31:59.965] else NULL, started = ...future.startTime, version = "1.8") [15:31:59.965] }, condition = base::local({ [15:31:59.965] c <- base::c [15:31:59.965] inherits <- base::inherits [15:31:59.965] invokeRestart <- base::invokeRestart [15:31:59.965] length <- base::length [15:31:59.965] list <- base::list [15:31:59.965] seq.int <- base::seq.int [15:31:59.965] signalCondition <- base::signalCondition [15:31:59.965] sys.calls <- base::sys.calls [15:31:59.965] `[[` <- base::`[[` [15:31:59.965] `+` <- base::`+` [15:31:59.965] `<<-` <- base::`<<-` [15:31:59.965] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:31:59.965] calls[seq.int(from = from + 12L, to = length(calls) - [15:31:59.965] 3L)] [15:31:59.965] } [15:31:59.965] function(cond) { [15:31:59.965] is_error <- inherits(cond, "error") [15:31:59.965] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:31:59.965] NULL) [15:31:59.965] if (is_error) { [15:31:59.965] sessionInformation <- function() { [15:31:59.965] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:31:59.965] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:31:59.965] search = base::search(), system = base::Sys.info()) [15:31:59.965] } [15:31:59.965] ...future.conditions[[length(...future.conditions) + [15:31:59.965] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:31:59.965] cond$call), session = sessionInformation(), [15:31:59.965] timestamp = base::Sys.time(), signaled = 0L) [15:31:59.965] signalCondition(cond) [15:31:59.965] } [15:31:59.965] else if (!ignore && TRUE && inherits(cond, c("condition", [15:31:59.965] "immediateCondition"))) { [15:31:59.965] signal <- TRUE && inherits(cond, "immediateCondition") [15:31:59.965] ...future.conditions[[length(...future.conditions) + [15:31:59.965] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:31:59.965] if (TRUE && !signal) { [15:31:59.965] muffleCondition <- function (cond, pattern = "^muffle") [15:31:59.965] { [15:31:59.965] inherits <- base::inherits [15:31:59.965] invokeRestart <- base::invokeRestart [15:31:59.965] is.null <- base::is.null [15:31:59.965] muffled <- FALSE [15:31:59.965] if (inherits(cond, "message")) { [15:31:59.965] muffled <- grepl(pattern, "muffleMessage") [15:31:59.965] if (muffled) [15:31:59.965] invokeRestart("muffleMessage") [15:31:59.965] } [15:31:59.965] else if (inherits(cond, "warning")) { [15:31:59.965] muffled <- grepl(pattern, "muffleWarning") [15:31:59.965] if (muffled) [15:31:59.965] invokeRestart("muffleWarning") [15:31:59.965] } [15:31:59.965] else if (inherits(cond, "condition")) { [15:31:59.965] if (!is.null(pattern)) { [15:31:59.965] computeRestarts <- base::computeRestarts [15:31:59.965] grepl <- base::grepl [15:31:59.965] restarts <- computeRestarts(cond) [15:31:59.965] for (restart in restarts) { [15:31:59.965] name <- restart$name [15:31:59.965] if (is.null(name)) [15:31:59.965] next [15:31:59.965] if (!grepl(pattern, name)) [15:31:59.965] next [15:31:59.965] invokeRestart(restart) [15:31:59.965] muffled <- TRUE [15:31:59.965] break [15:31:59.965] } [15:31:59.965] } [15:31:59.965] } [15:31:59.965] invisible(muffled) [15:31:59.965] } [15:31:59.965] muffleCondition(cond, pattern = "^muffle") [15:31:59.965] } [15:31:59.965] } [15:31:59.965] else { [15:31:59.965] if (TRUE) { [15:31:59.965] muffleCondition <- function (cond, pattern = "^muffle") [15:31:59.965] { [15:31:59.965] inherits <- base::inherits [15:31:59.965] invokeRestart <- base::invokeRestart [15:31:59.965] is.null <- base::is.null [15:31:59.965] muffled <- FALSE [15:31:59.965] if (inherits(cond, "message")) { [15:31:59.965] muffled <- grepl(pattern, "muffleMessage") [15:31:59.965] if (muffled) [15:31:59.965] invokeRestart("muffleMessage") [15:31:59.965] } [15:31:59.965] else if (inherits(cond, "warning")) { [15:31:59.965] muffled <- grepl(pattern, "muffleWarning") [15:31:59.965] if (muffled) [15:31:59.965] invokeRestart("muffleWarning") [15:31:59.965] } [15:31:59.965] else if (inherits(cond, "condition")) { [15:31:59.965] if (!is.null(pattern)) { [15:31:59.965] computeRestarts <- base::computeRestarts [15:31:59.965] grepl <- base::grepl [15:31:59.965] restarts <- computeRestarts(cond) [15:31:59.965] for (restart in restarts) { [15:31:59.965] name <- restart$name [15:31:59.965] if (is.null(name)) [15:31:59.965] next [15:31:59.965] if (!grepl(pattern, name)) [15:31:59.965] next [15:31:59.965] invokeRestart(restart) [15:31:59.965] muffled <- TRUE [15:31:59.965] break [15:31:59.965] } [15:31:59.965] } [15:31:59.965] } [15:31:59.965] invisible(muffled) [15:31:59.965] } [15:31:59.965] muffleCondition(cond, pattern = "^muffle") [15:31:59.965] } [15:31:59.965] } [15:31:59.965] } [15:31:59.965] })) [15:31:59.965] }, error = function(ex) { [15:31:59.965] base::structure(base::list(value = NULL, visible = NULL, [15:31:59.965] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:31:59.965] ...future.rng), started = ...future.startTime, [15:31:59.965] finished = Sys.time(), session_uuid = NA_character_, [15:31:59.965] version = "1.8"), class = "FutureResult") [15:31:59.965] }, finally = { [15:31:59.965] if (!identical(...future.workdir, getwd())) [15:31:59.965] setwd(...future.workdir) [15:31:59.965] { [15:31:59.965] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:31:59.965] ...future.oldOptions$nwarnings <- NULL [15:31:59.965] } [15:31:59.965] base::options(...future.oldOptions) [15:31:59.965] if (.Platform$OS.type == "windows") { [15:31:59.965] old_names <- names(...future.oldEnvVars) [15:31:59.965] envs <- base::Sys.getenv() [15:31:59.965] names <- names(envs) [15:31:59.965] common <- intersect(names, old_names) [15:31:59.965] added <- setdiff(names, old_names) [15:31:59.965] removed <- setdiff(old_names, names) [15:31:59.965] changed <- common[...future.oldEnvVars[common] != [15:31:59.965] envs[common]] [15:31:59.965] NAMES <- toupper(changed) [15:31:59.965] args <- list() [15:31:59.965] for (kk in seq_along(NAMES)) { [15:31:59.965] name <- changed[[kk]] [15:31:59.965] NAME <- NAMES[[kk]] [15:31:59.965] if (name != NAME && is.element(NAME, old_names)) [15:31:59.965] next [15:31:59.965] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:59.965] } [15:31:59.965] NAMES <- toupper(added) [15:31:59.965] for (kk in seq_along(NAMES)) { [15:31:59.965] name <- added[[kk]] [15:31:59.965] NAME <- NAMES[[kk]] [15:31:59.965] if (name != NAME && is.element(NAME, old_names)) [15:31:59.965] next [15:31:59.965] args[[name]] <- "" [15:31:59.965] } [15:31:59.965] NAMES <- toupper(removed) [15:31:59.965] for (kk in seq_along(NAMES)) { [15:31:59.965] name <- removed[[kk]] [15:31:59.965] NAME <- NAMES[[kk]] [15:31:59.965] if (name != NAME && is.element(NAME, old_names)) [15:31:59.965] next [15:31:59.965] args[[name]] <- ...future.oldEnvVars[[name]] [15:31:59.965] } [15:31:59.965] if (length(args) > 0) [15:31:59.965] base::do.call(base::Sys.setenv, args = args) [15:31:59.965] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:31:59.965] } [15:31:59.965] else { [15:31:59.965] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:31:59.965] } [15:31:59.965] { [15:31:59.965] if (base::length(...future.futureOptionsAdded) > [15:31:59.965] 0L) { [15:31:59.965] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:31:59.965] base::names(opts) <- ...future.futureOptionsAdded [15:31:59.965] base::options(opts) [15:31:59.965] } [15:31:59.965] { [15:31:59.965] { [15:31:59.965] base::options(mc.cores = ...future.mc.cores.old) [15:31:59.965] NULL [15:31:59.965] } [15:31:59.965] options(future.plan = NULL) [15:31:59.965] if (is.na(NA_character_)) [15:31:59.965] Sys.unsetenv("R_FUTURE_PLAN") [15:31:59.965] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:31:59.965] future::plan(...future.strategy.old, .cleanup = FALSE, [15:31:59.965] .init = FALSE) [15:31:59.965] } [15:31:59.965] } [15:31:59.965] } [15:31:59.965] }) [15:31:59.965] if (TRUE) { [15:31:59.965] base::sink(type = "output", split = FALSE) [15:31:59.965] if (TRUE) { [15:31:59.965] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:31:59.965] } [15:31:59.965] else { [15:31:59.965] ...future.result["stdout"] <- base::list(NULL) [15:31:59.965] } [15:31:59.965] base::close(...future.stdout) [15:31:59.965] ...future.stdout <- NULL [15:31:59.965] } [15:31:59.965] ...future.result$conditions <- ...future.conditions [15:31:59.965] ...future.result$finished <- base::Sys.time() [15:31:59.965] ...future.result [15:31:59.965] } [15:31:59.971] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:31:59.972] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:31:59.972] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:31:59.973] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:31:59.973] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:31:59.973] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... [15:31:59.974] Exporting '...future.elements_ii' (232 bytes) to cluster node #1 ... DONE [15:31:59.974] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:31:59.975] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:31:59.975] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:31:59.975] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:31:59.975] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:31:59.976] MultisessionFuture started [15:31:59.976] - Launch lazy future ... done [15:31:59.977] run() for 'MultisessionFuture' ... done [15:31:59.977] Created future: [15:31:59.994] receiveMessageFromWorker() for ClusterFuture ... [15:31:59.995] - Validating connection of MultisessionFuture [15:31:59.996] - received message: FutureResult [15:31:59.996] - Received FutureResult [15:31:59.997] - Erased future from FutureRegistry [15:31:59.997] result() for ClusterFuture ... [15:31:59.997] - result already collected: FutureResult [15:31:59.998] result() for ClusterFuture ... done [15:31:59.998] receiveMessageFromWorker() for ClusterFuture ... done [15:31:59.977] MultisessionFuture: [15:31:59.977] Label: 'future_lapply-1' [15:31:59.977] Expression: [15:31:59.977] { [15:31:59.977] do.call(function(...) { [15:31:59.977] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:31:59.977] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:31:59.977] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:31:59.977] on.exit(options(oopts), add = TRUE) [15:31:59.977] } [15:31:59.977] { [15:31:59.977] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:31:59.977] ...future.X_jj <- ...future.elements_ii[[jj]] [15:31:59.977] ...future.FUN(...future.X_jj, ...) [15:31:59.977] }) [15:31:59.977] } [15:31:59.977] }, args = future.call.arguments) [15:31:59.977] } [15:31:59.977] Lazy evaluation: FALSE [15:31:59.977] Asynchronous evaluation: TRUE [15:31:59.977] Local evaluation: TRUE [15:31:59.977] Environment: R_GlobalEnv [15:31:59.977] Capture standard output: TRUE [15:31:59.977] Capture condition classes: 'condition' (excluding 'nothing') [15:31:59.977] Globals: 5 objects totaling 2.41 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 232 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:31:59.977] Packages: [15:31:59.977] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:31:59.977] Resolved: TRUE [15:31:59.977] Value: [15:31:59.977] Conditions captured: [15:31:59.977] Early signaling: FALSE [15:31:59.977] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:31:59.977] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:31:59.999] Chunk #1 of 2 ... DONE [15:31:59.999] Chunk #2 of 2 ... [15:31:59.999] - Finding globals in 'X' for chunk #2 ... [15:32:00.000] getGlobalsAndPackages() ... [15:32:00.000] Searching for globals... [15:32:00.001] [15:32:00.001] Searching for globals ... DONE [15:32:00.001] - globals: [0] [15:32:00.002] getGlobalsAndPackages() ... DONE [15:32:00.002] + additional globals found: [n=0] [15:32:00.003] + additional namespaces needed: [n=0] [15:32:00.003] - Finding globals in 'X' for chunk #2 ... DONE [15:32:00.003] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:32:00.003] - seeds: [15:32:00.004] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:00.004] getGlobalsAndPackages() ... [15:32:00.004] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:00.005] Resolving globals: FALSE [15:32:00.005] Tweak future expression to call with '...' arguments ... [15:32:00.005] { [15:32:00.005] do.call(function(...) { [15:32:00.005] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:00.005] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:32:00.005] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:00.005] on.exit(options(oopts), add = TRUE) [15:32:00.005] } [15:32:00.005] { [15:32:00.005] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:32:00.005] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:00.005] ...future.FUN(...future.X_jj, ...) [15:32:00.005] }) [15:32:00.005] } [15:32:00.005] }, args = future.call.arguments) [15:32:00.005] } [15:32:00.006] Tweak future expression to call with '...' arguments ... DONE [15:32:00.007] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:00.007] [15:32:00.008] getGlobalsAndPackages() ... DONE [15:32:00.008] run() for 'Future' ... [15:32:00.008] - state: 'created' [15:32:00.009] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:32:00.030] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:32:00.030] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:32:00.031] - Field: 'node' [15:32:00.031] - Field: 'label' [15:32:00.031] - Field: 'local' [15:32:00.032] - Field: 'owner' [15:32:00.032] - Field: 'envir' [15:32:00.032] - Field: 'workers' [15:32:00.033] - Field: 'packages' [15:32:00.033] - Field: 'gc' [15:32:00.033] - Field: 'conditions' [15:32:00.034] - Field: 'persistent' [15:32:00.034] - Field: 'expr' [15:32:00.034] - Field: 'uuid' [15:32:00.035] - Field: 'seed' [15:32:00.035] - Field: 'version' [15:32:00.035] - Field: 'result' [15:32:00.036] - Field: 'asynchronous' [15:32:00.036] - Field: 'calls' [15:32:00.036] - Field: 'globals' [15:32:00.037] - Field: 'stdout' [15:32:00.037] - Field: 'earlySignal' [15:32:00.037] - Field: 'lazy' [15:32:00.037] - Field: 'state' [15:32:00.038] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:32:00.038] - Launch lazy future ... [15:32:00.039] Packages needed by the future expression (n = 0): [15:32:00.039] Packages needed by future strategies (n = 0): [15:32:00.040] { [15:32:00.040] { [15:32:00.040] { [15:32:00.040] ...future.startTime <- base::Sys.time() [15:32:00.040] { [15:32:00.040] { [15:32:00.040] { [15:32:00.040] { [15:32:00.040] base::local({ [15:32:00.040] has_future <- base::requireNamespace("future", [15:32:00.040] quietly = TRUE) [15:32:00.040] if (has_future) { [15:32:00.040] ns <- base::getNamespace("future") [15:32:00.040] version <- ns[[".package"]][["version"]] [15:32:00.040] if (is.null(version)) [15:32:00.040] version <- utils::packageVersion("future") [15:32:00.040] } [15:32:00.040] else { [15:32:00.040] version <- NULL [15:32:00.040] } [15:32:00.040] if (!has_future || version < "1.8.0") { [15:32:00.040] info <- base::c(r_version = base::gsub("R version ", [15:32:00.040] "", base::R.version$version.string), [15:32:00.040] platform = base::sprintf("%s (%s-bit)", [15:32:00.040] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:32:00.040] os = base::paste(base::Sys.info()[base::c("sysname", [15:32:00.040] "release", "version")], collapse = " "), [15:32:00.040] hostname = base::Sys.info()[["nodename"]]) [15:32:00.040] info <- base::sprintf("%s: %s", base::names(info), [15:32:00.040] info) [15:32:00.040] info <- base::paste(info, collapse = "; ") [15:32:00.040] if (!has_future) { [15:32:00.040] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:32:00.040] info) [15:32:00.040] } [15:32:00.040] else { [15:32:00.040] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:32:00.040] info, version) [15:32:00.040] } [15:32:00.040] base::stop(msg) [15:32:00.040] } [15:32:00.040] }) [15:32:00.040] } [15:32:00.040] ...future.mc.cores.old <- base::getOption("mc.cores") [15:32:00.040] base::options(mc.cores = 1L) [15:32:00.040] } [15:32:00.040] ...future.strategy.old <- future::plan("list") [15:32:00.040] options(future.plan = NULL) [15:32:00.040] Sys.unsetenv("R_FUTURE_PLAN") [15:32:00.040] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:32:00.040] } [15:32:00.040] ...future.workdir <- getwd() [15:32:00.040] } [15:32:00.040] ...future.oldOptions <- base::as.list(base::.Options) [15:32:00.040] ...future.oldEnvVars <- base::Sys.getenv() [15:32:00.040] } [15:32:00.040] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:32:00.040] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:32:00.040] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:32:00.040] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:32:00.040] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:32:00.040] future.stdout.windows.reencode = NULL, width = 80L) [15:32:00.040] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:32:00.040] base::names(...future.oldOptions)) [15:32:00.040] } [15:32:00.040] if (FALSE) { [15:32:00.040] } [15:32:00.040] else { [15:32:00.040] if (TRUE) { [15:32:00.040] ...future.stdout <- base::rawConnection(base::raw(0L), [15:32:00.040] open = "w") [15:32:00.040] } [15:32:00.040] else { [15:32:00.040] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:32:00.040] windows = "NUL", "/dev/null"), open = "w") [15:32:00.040] } [15:32:00.040] base::sink(...future.stdout, type = "output", split = FALSE) [15:32:00.040] base::on.exit(if (!base::is.null(...future.stdout)) { [15:32:00.040] base::sink(type = "output", split = FALSE) [15:32:00.040] base::close(...future.stdout) [15:32:00.040] }, add = TRUE) [15:32:00.040] } [15:32:00.040] ...future.frame <- base::sys.nframe() [15:32:00.040] ...future.conditions <- base::list() [15:32:00.040] ...future.rng <- base::globalenv()$.Random.seed [15:32:00.040] if (FALSE) { [15:32:00.040] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:32:00.040] "...future.value", "...future.globalenv.names", ".Random.seed") [15:32:00.040] } [15:32:00.040] ...future.result <- base::tryCatch({ [15:32:00.040] base::withCallingHandlers({ [15:32:00.040] ...future.value <- base::withVisible(base::local({ [15:32:00.040] ...future.makeSendCondition <- base::local({ [15:32:00.040] sendCondition <- NULL [15:32:00.040] function(frame = 1L) { [15:32:00.040] if (is.function(sendCondition)) [15:32:00.040] return(sendCondition) [15:32:00.040] ns <- getNamespace("parallel") [15:32:00.040] if (exists("sendData", mode = "function", [15:32:00.040] envir = ns)) { [15:32:00.040] parallel_sendData <- get("sendData", mode = "function", [15:32:00.040] envir = ns) [15:32:00.040] envir <- sys.frame(frame) [15:32:00.040] master <- NULL [15:32:00.040] while (!identical(envir, .GlobalEnv) && [15:32:00.040] !identical(envir, emptyenv())) { [15:32:00.040] if (exists("master", mode = "list", envir = envir, [15:32:00.040] inherits = FALSE)) { [15:32:00.040] master <- get("master", mode = "list", [15:32:00.040] envir = envir, inherits = FALSE) [15:32:00.040] if (inherits(master, c("SOCKnode", [15:32:00.040] "SOCK0node"))) { [15:32:00.040] sendCondition <<- function(cond) { [15:32:00.040] data <- list(type = "VALUE", value = cond, [15:32:00.040] success = TRUE) [15:32:00.040] parallel_sendData(master, data) [15:32:00.040] } [15:32:00.040] return(sendCondition) [15:32:00.040] } [15:32:00.040] } [15:32:00.040] frame <- frame + 1L [15:32:00.040] envir <- sys.frame(frame) [15:32:00.040] } [15:32:00.040] } [15:32:00.040] sendCondition <<- function(cond) NULL [15:32:00.040] } [15:32:00.040] }) [15:32:00.040] withCallingHandlers({ [15:32:00.040] { [15:32:00.040] do.call(function(...) { [15:32:00.040] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:00.040] if (!identical(...future.globals.maxSize.org, [15:32:00.040] ...future.globals.maxSize)) { [15:32:00.040] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:00.040] on.exit(options(oopts), add = TRUE) [15:32:00.040] } [15:32:00.040] { [15:32:00.040] lapply(seq_along(...future.elements_ii), [15:32:00.040] FUN = function(jj) { [15:32:00.040] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:00.040] ...future.FUN(...future.X_jj, ...) [15:32:00.040] }) [15:32:00.040] } [15:32:00.040] }, args = future.call.arguments) [15:32:00.040] } [15:32:00.040] }, immediateCondition = function(cond) { [15:32:00.040] sendCondition <- ...future.makeSendCondition() [15:32:00.040] sendCondition(cond) [15:32:00.040] muffleCondition <- function (cond, pattern = "^muffle") [15:32:00.040] { [15:32:00.040] inherits <- base::inherits [15:32:00.040] invokeRestart <- base::invokeRestart [15:32:00.040] is.null <- base::is.null [15:32:00.040] muffled <- FALSE [15:32:00.040] if (inherits(cond, "message")) { [15:32:00.040] muffled <- grepl(pattern, "muffleMessage") [15:32:00.040] if (muffled) [15:32:00.040] invokeRestart("muffleMessage") [15:32:00.040] } [15:32:00.040] else if (inherits(cond, "warning")) { [15:32:00.040] muffled <- grepl(pattern, "muffleWarning") [15:32:00.040] if (muffled) [15:32:00.040] invokeRestart("muffleWarning") [15:32:00.040] } [15:32:00.040] else if (inherits(cond, "condition")) { [15:32:00.040] if (!is.null(pattern)) { [15:32:00.040] computeRestarts <- base::computeRestarts [15:32:00.040] grepl <- base::grepl [15:32:00.040] restarts <- computeRestarts(cond) [15:32:00.040] for (restart in restarts) { [15:32:00.040] name <- restart$name [15:32:00.040] if (is.null(name)) [15:32:00.040] next [15:32:00.040] if (!grepl(pattern, name)) [15:32:00.040] next [15:32:00.040] invokeRestart(restart) [15:32:00.040] muffled <- TRUE [15:32:00.040] break [15:32:00.040] } [15:32:00.040] } [15:32:00.040] } [15:32:00.040] invisible(muffled) [15:32:00.040] } [15:32:00.040] muffleCondition(cond) [15:32:00.040] }) [15:32:00.040] })) [15:32:00.040] future::FutureResult(value = ...future.value$value, [15:32:00.040] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:32:00.040] ...future.rng), globalenv = if (FALSE) [15:32:00.040] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:32:00.040] ...future.globalenv.names)) [15:32:00.040] else NULL, started = ...future.startTime, version = "1.8") [15:32:00.040] }, condition = base::local({ [15:32:00.040] c <- base::c [15:32:00.040] inherits <- base::inherits [15:32:00.040] invokeRestart <- base::invokeRestart [15:32:00.040] length <- base::length [15:32:00.040] list <- base::list [15:32:00.040] seq.int <- base::seq.int [15:32:00.040] signalCondition <- base::signalCondition [15:32:00.040] sys.calls <- base::sys.calls [15:32:00.040] `[[` <- base::`[[` [15:32:00.040] `+` <- base::`+` [15:32:00.040] `<<-` <- base::`<<-` [15:32:00.040] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:32:00.040] calls[seq.int(from = from + 12L, to = length(calls) - [15:32:00.040] 3L)] [15:32:00.040] } [15:32:00.040] function(cond) { [15:32:00.040] is_error <- inherits(cond, "error") [15:32:00.040] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:32:00.040] NULL) [15:32:00.040] if (is_error) { [15:32:00.040] sessionInformation <- function() { [15:32:00.040] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:32:00.040] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:32:00.040] search = base::search(), system = base::Sys.info()) [15:32:00.040] } [15:32:00.040] ...future.conditions[[length(...future.conditions) + [15:32:00.040] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:32:00.040] cond$call), session = sessionInformation(), [15:32:00.040] timestamp = base::Sys.time(), signaled = 0L) [15:32:00.040] signalCondition(cond) [15:32:00.040] } [15:32:00.040] else if (!ignore && TRUE && inherits(cond, c("condition", [15:32:00.040] "immediateCondition"))) { [15:32:00.040] signal <- TRUE && inherits(cond, "immediateCondition") [15:32:00.040] ...future.conditions[[length(...future.conditions) + [15:32:00.040] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:32:00.040] if (TRUE && !signal) { [15:32:00.040] muffleCondition <- function (cond, pattern = "^muffle") [15:32:00.040] { [15:32:00.040] inherits <- base::inherits [15:32:00.040] invokeRestart <- base::invokeRestart [15:32:00.040] is.null <- base::is.null [15:32:00.040] muffled <- FALSE [15:32:00.040] if (inherits(cond, "message")) { [15:32:00.040] muffled <- grepl(pattern, "muffleMessage") [15:32:00.040] if (muffled) [15:32:00.040] invokeRestart("muffleMessage") [15:32:00.040] } [15:32:00.040] else if (inherits(cond, "warning")) { [15:32:00.040] muffled <- grepl(pattern, "muffleWarning") [15:32:00.040] if (muffled) [15:32:00.040] invokeRestart("muffleWarning") [15:32:00.040] } [15:32:00.040] else if (inherits(cond, "condition")) { [15:32:00.040] if (!is.null(pattern)) { [15:32:00.040] computeRestarts <- base::computeRestarts [15:32:00.040] grepl <- base::grepl [15:32:00.040] restarts <- computeRestarts(cond) [15:32:00.040] for (restart in restarts) { [15:32:00.040] name <- restart$name [15:32:00.040] if (is.null(name)) [15:32:00.040] next [15:32:00.040] if (!grepl(pattern, name)) [15:32:00.040] next [15:32:00.040] invokeRestart(restart) [15:32:00.040] muffled <- TRUE [15:32:00.040] break [15:32:00.040] } [15:32:00.040] } [15:32:00.040] } [15:32:00.040] invisible(muffled) [15:32:00.040] } [15:32:00.040] muffleCondition(cond, pattern = "^muffle") [15:32:00.040] } [15:32:00.040] } [15:32:00.040] else { [15:32:00.040] if (TRUE) { [15:32:00.040] muffleCondition <- function (cond, pattern = "^muffle") [15:32:00.040] { [15:32:00.040] inherits <- base::inherits [15:32:00.040] invokeRestart <- base::invokeRestart [15:32:00.040] is.null <- base::is.null [15:32:00.040] muffled <- FALSE [15:32:00.040] if (inherits(cond, "message")) { [15:32:00.040] muffled <- grepl(pattern, "muffleMessage") [15:32:00.040] if (muffled) [15:32:00.040] invokeRestart("muffleMessage") [15:32:00.040] } [15:32:00.040] else if (inherits(cond, "warning")) { [15:32:00.040] muffled <- grepl(pattern, "muffleWarning") [15:32:00.040] if (muffled) [15:32:00.040] invokeRestart("muffleWarning") [15:32:00.040] } [15:32:00.040] else if (inherits(cond, "condition")) { [15:32:00.040] if (!is.null(pattern)) { [15:32:00.040] computeRestarts <- base::computeRestarts [15:32:00.040] grepl <- base::grepl [15:32:00.040] restarts <- computeRestarts(cond) [15:32:00.040] for (restart in restarts) { [15:32:00.040] name <- restart$name [15:32:00.040] if (is.null(name)) [15:32:00.040] next [15:32:00.040] if (!grepl(pattern, name)) [15:32:00.040] next [15:32:00.040] invokeRestart(restart) [15:32:00.040] muffled <- TRUE [15:32:00.040] break [15:32:00.040] } [15:32:00.040] } [15:32:00.040] } [15:32:00.040] invisible(muffled) [15:32:00.040] } [15:32:00.040] muffleCondition(cond, pattern = "^muffle") [15:32:00.040] } [15:32:00.040] } [15:32:00.040] } [15:32:00.040] })) [15:32:00.040] }, error = function(ex) { [15:32:00.040] base::structure(base::list(value = NULL, visible = NULL, [15:32:00.040] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:32:00.040] ...future.rng), started = ...future.startTime, [15:32:00.040] finished = Sys.time(), session_uuid = NA_character_, [15:32:00.040] version = "1.8"), class = "FutureResult") [15:32:00.040] }, finally = { [15:32:00.040] if (!identical(...future.workdir, getwd())) [15:32:00.040] setwd(...future.workdir) [15:32:00.040] { [15:32:00.040] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:32:00.040] ...future.oldOptions$nwarnings <- NULL [15:32:00.040] } [15:32:00.040] base::options(...future.oldOptions) [15:32:00.040] if (.Platform$OS.type == "windows") { [15:32:00.040] old_names <- names(...future.oldEnvVars) [15:32:00.040] envs <- base::Sys.getenv() [15:32:00.040] names <- names(envs) [15:32:00.040] common <- intersect(names, old_names) [15:32:00.040] added <- setdiff(names, old_names) [15:32:00.040] removed <- setdiff(old_names, names) [15:32:00.040] changed <- common[...future.oldEnvVars[common] != [15:32:00.040] envs[common]] [15:32:00.040] NAMES <- toupper(changed) [15:32:00.040] args <- list() [15:32:00.040] for (kk in seq_along(NAMES)) { [15:32:00.040] name <- changed[[kk]] [15:32:00.040] NAME <- NAMES[[kk]] [15:32:00.040] if (name != NAME && is.element(NAME, old_names)) [15:32:00.040] next [15:32:00.040] args[[name]] <- ...future.oldEnvVars[[name]] [15:32:00.040] } [15:32:00.040] NAMES <- toupper(added) [15:32:00.040] for (kk in seq_along(NAMES)) { [15:32:00.040] name <- added[[kk]] [15:32:00.040] NAME <- NAMES[[kk]] [15:32:00.040] if (name != NAME && is.element(NAME, old_names)) [15:32:00.040] next [15:32:00.040] args[[name]] <- "" [15:32:00.040] } [15:32:00.040] NAMES <- toupper(removed) [15:32:00.040] for (kk in seq_along(NAMES)) { [15:32:00.040] name <- removed[[kk]] [15:32:00.040] NAME <- NAMES[[kk]] [15:32:00.040] if (name != NAME && is.element(NAME, old_names)) [15:32:00.040] next [15:32:00.040] args[[name]] <- ...future.oldEnvVars[[name]] [15:32:00.040] } [15:32:00.040] if (length(args) > 0) [15:32:00.040] base::do.call(base::Sys.setenv, args = args) [15:32:00.040] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:32:00.040] } [15:32:00.040] else { [15:32:00.040] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:32:00.040] } [15:32:00.040] { [15:32:00.040] if (base::length(...future.futureOptionsAdded) > [15:32:00.040] 0L) { [15:32:00.040] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:32:00.040] base::names(opts) <- ...future.futureOptionsAdded [15:32:00.040] base::options(opts) [15:32:00.040] } [15:32:00.040] { [15:32:00.040] { [15:32:00.040] base::options(mc.cores = ...future.mc.cores.old) [15:32:00.040] NULL [15:32:00.040] } [15:32:00.040] options(future.plan = NULL) [15:32:00.040] if (is.na(NA_character_)) [15:32:00.040] Sys.unsetenv("R_FUTURE_PLAN") [15:32:00.040] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:32:00.040] future::plan(...future.strategy.old, .cleanup = FALSE, [15:32:00.040] .init = FALSE) [15:32:00.040] } [15:32:00.040] } [15:32:00.040] } [15:32:00.040] }) [15:32:00.040] if (TRUE) { [15:32:00.040] base::sink(type = "output", split = FALSE) [15:32:00.040] if (TRUE) { [15:32:00.040] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:32:00.040] } [15:32:00.040] else { [15:32:00.040] ...future.result["stdout"] <- base::list(NULL) [15:32:00.040] } [15:32:00.040] base::close(...future.stdout) [15:32:00.040] ...future.stdout <- NULL [15:32:00.040] } [15:32:00.040] ...future.result$conditions <- ...future.conditions [15:32:00.040] ...future.result$finished <- base::Sys.time() [15:32:00.040] ...future.result [15:32:00.040] } [15:32:00.050] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... [15:32:00.051] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... [15:32:00.051] Exporting '...future.FUN' (2.13 KiB) to cluster node #1 ... DONE [15:32:00.052] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... [15:32:00.053] Exporting 'future.call.arguments' (56 bytes) to cluster node #1 ... DONE [15:32:00.053] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... [15:32:00.054] Exporting '...future.elements_ii' (224 bytes) to cluster node #1 ... DONE [15:32:00.054] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:32:00.055] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:32:00.055] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:32:00.056] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:32:00.056] Exporting 5 global objects (2.19 KiB) to cluster node #1 ... DONE [15:32:00.058] MultisessionFuture started [15:32:00.058] - Launch lazy future ... done [15:32:00.058] run() for 'MultisessionFuture' ... done [15:32:00.059] Created future: [15:32:00.086] receiveMessageFromWorker() for ClusterFuture ... [15:32:00.087] - Validating connection of MultisessionFuture [15:32:00.088] - received message: FutureResult [15:32:00.088] - Received FutureResult [15:32:00.088] - Erased future from FutureRegistry [15:32:00.089] result() for ClusterFuture ... [15:32:00.089] - result already collected: FutureResult [15:32:00.089] result() for ClusterFuture ... done [15:32:00.090] receiveMessageFromWorker() for ClusterFuture ... done [15:32:00.059] MultisessionFuture: [15:32:00.059] Label: 'future_lapply-2' [15:32:00.059] Expression: [15:32:00.059] { [15:32:00.059] do.call(function(...) { [15:32:00.059] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:00.059] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:32:00.059] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:00.059] on.exit(options(oopts), add = TRUE) [15:32:00.059] } [15:32:00.059] { [15:32:00.059] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:32:00.059] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:00.059] ...future.FUN(...future.X_jj, ...) [15:32:00.059] }) [15:32:00.059] } [15:32:00.059] }, args = future.call.arguments) [15:32:00.059] } [15:32:00.059] Lazy evaluation: FALSE [15:32:00.059] Asynchronous evaluation: TRUE [15:32:00.059] Local evaluation: TRUE [15:32:00.059] Environment: R_GlobalEnv [15:32:00.059] Capture standard output: TRUE [15:32:00.059] Capture condition classes: 'condition' (excluding 'nothing') [15:32:00.059] Globals: 5 objects totaling 2.41 KiB (function '...future.FUN' of 2.13 KiB, DotDotDotList 'future.call.arguments' of 56 bytes, list '...future.elements_ii' of 224 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:32:00.059] Packages: [15:32:00.059] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:32:00.059] Resolved: TRUE [15:32:00.059] Value: [15:32:00.059] Conditions captured: [15:32:00.059] Early signaling: FALSE [15:32:00.059] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:32:00.059] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:32:00.091] Chunk #2 of 2 ... DONE [15:32:00.091] Launching 2 futures (chunks) ... DONE [15:32:00.091] Resolving 2 futures (chunks) ... [15:32:00.092] resolve() on list ... [15:32:00.092] recursive: 0 [15:32:00.092] length: 2 [15:32:00.093] [15:32:00.093] Future #1 [15:32:00.093] result() for ClusterFuture ... [15:32:00.094] - result already collected: FutureResult [15:32:00.094] result() for ClusterFuture ... done [15:32:00.094] result() for ClusterFuture ... [15:32:00.095] - result already collected: FutureResult [15:32:00.095] result() for ClusterFuture ... done [15:32:00.095] signalConditionsASAP(MultisessionFuture, pos=1) ... [15:32:00.096] - nx: 2 [15:32:00.096] - relay: TRUE [15:32:00.096] - stdout: TRUE [15:32:00.096] - signal: TRUE [15:32:00.097] - resignal: FALSE [15:32:00.097] - force: TRUE [15:32:00.097] - relayed: [n=2] FALSE, FALSE [15:32:00.097] - queued futures: [n=2] FALSE, FALSE [15:32:00.098] - until=1 [15:32:00.098] - relaying element #1 [15:32:00.099] result() for ClusterFuture ... [15:32:00.099] - result already collected: FutureResult [15:32:00.099] result() for ClusterFuture ... done [15:32:00.100] result() for ClusterFuture ... [15:32:00.100] - result already collected: FutureResult [15:32:00.100] result() for ClusterFuture ... done [15:32:00.101] result() for ClusterFuture ... [15:32:00.101] - result already collected: FutureResult [15:32:00.101] result() for ClusterFuture ... done [15:32:00.102] result() for ClusterFuture ... [15:32:00.102] - result already collected: FutureResult [15:32:00.102] result() for ClusterFuture ... done [15:32:00.103] - relayed: [n=2] TRUE, FALSE [15:32:00.103] - queued futures: [n=2] TRUE, FALSE [15:32:00.103] signalConditionsASAP(MultisessionFuture, pos=1) ... done [15:32:00.104] length: 1 (resolved future 1) [15:32:00.104] Future #2 [15:32:00.104] result() for ClusterFuture ... [15:32:00.105] - result already collected: FutureResult [15:32:00.105] result() for ClusterFuture ... done [15:32:00.105] result() for ClusterFuture ... [15:32:00.106] - result already collected: FutureResult [15:32:00.106] result() for ClusterFuture ... done [15:32:00.106] signalConditionsASAP(MultisessionFuture, pos=2) ... [15:32:00.107] - nx: 2 [15:32:00.107] - relay: TRUE [15:32:00.107] - stdout: TRUE [15:32:00.108] - signal: TRUE [15:32:00.108] - resignal: FALSE [15:32:00.108] - force: TRUE [15:32:00.108] - relayed: [n=2] TRUE, FALSE [15:32:00.109] - queued futures: [n=2] TRUE, FALSE [15:32:00.109] - until=2 [15:32:00.109] - relaying element #2 [15:32:00.110] result() for ClusterFuture ... [15:32:00.110] - result already collected: FutureResult [15:32:00.110] result() for ClusterFuture ... done [15:32:00.111] result() for ClusterFuture ... [15:32:00.111] - result already collected: FutureResult [15:32:00.111] result() for ClusterFuture ... done [15:32:00.112] result() for ClusterFuture ... [15:32:00.112] - result already collected: FutureResult [15:32:00.112] result() for ClusterFuture ... done [15:32:00.113] result() for ClusterFuture ... [15:32:00.113] - result already collected: FutureResult [15:32:00.113] result() for ClusterFuture ... done [15:32:00.114] - relayed: [n=2] TRUE, TRUE [15:32:00.114] - queued futures: [n=2] TRUE, TRUE [15:32:00.114] signalConditionsASAP(MultisessionFuture, pos=2) ... done [15:32:00.115] length: 0 (resolved future 2) [15:32:00.115] Relaying remaining futures [15:32:00.115] signalConditionsASAP(NULL, pos=0) ... [15:32:00.116] - nx: 2 [15:32:00.116] - relay: TRUE [15:32:00.116] - stdout: TRUE [15:32:00.116] - signal: TRUE [15:32:00.117] - resignal: FALSE [15:32:00.117] - force: TRUE [15:32:00.117] - relayed: [n=2] TRUE, TRUE [15:32:00.118] - queued futures: [n=2] TRUE, TRUE - flush all [15:32:00.118] - relayed: [n=2] TRUE, TRUE [15:32:00.118] - queued futures: [n=2] TRUE, TRUE [15:32:00.119] signalConditionsASAP(NULL, pos=0) ... done [15:32:00.119] resolve() on list ... DONE [15:32:00.119] result() for ClusterFuture ... [15:32:00.120] - result already collected: FutureResult [15:32:00.120] result() for ClusterFuture ... done [15:32:00.120] result() for ClusterFuture ... [15:32:00.121] - result already collected: FutureResult [15:32:00.121] result() for ClusterFuture ... done [15:32:00.121] result() for ClusterFuture ... [15:32:00.121] - result already collected: FutureResult [15:32:00.122] result() for ClusterFuture ... done [15:32:00.122] result() for ClusterFuture ... [15:32:00.122] - result already collected: FutureResult [15:32:00.123] result() for ClusterFuture ... done [15:32:00.123] - Number of value chunks collected: 2 [15:32:00.123] Resolving 2 futures (chunks) ... DONE [15:32:00.124] Reducing values from 2 chunks ... [15:32:00.124] - Number of values collected after concatenation: 4 [15:32:00.124] - Number of values expected: 4 [15:32:00.125] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [15:32:00.125] Reducing values from 2 chunks ... DONE [15:32:00.125] 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, ...) ... [15:32:00.131] future_lapply() ... [15:32:00.153] Number of chunks: 1 [15:32:00.154] getGlobalsAndPackagesXApply() ... [15:32:00.154] - future.globals: TRUE [15:32:00.155] getGlobalsAndPackages() ... [15:32:00.155] Searching for globals... [15:32:00.171] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [15:32:00.172] Searching for globals ... DONE [15:32:00.172] Resolving globals: FALSE [15:32:00.174] The total size of the 1 globals is 69.62 KiB (71288 bytes) [15:32:00.175] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 69.62 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (69.62 KiB of class 'function') [15:32:00.175] - globals: [1] 'FUN' [15:32:00.175] - packages: [1] 'future' [15:32:00.176] getGlobalsAndPackages() ... DONE [15:32:00.176] - globals found/used: [n=1] 'FUN' [15:32:00.176] - needed namespaces: [n=1] 'future' [15:32:00.177] Finding globals ... DONE [15:32:00.177] - use_args: TRUE [15:32:00.177] - Getting '...' globals ... [15:32:00.178] resolve() on list ... [15:32:00.178] recursive: 0 [15:32:00.178] length: 1 [15:32:00.179] elements: '...' [15:32:00.179] length: 0 (resolved future 1) [15:32:00.179] resolve() on list ... DONE [15:32:00.179] - '...' content: [n=2] 'collapse', 'maxHead' [15:32:00.180] List of 1 [15:32:00.180] $ ...:List of 2 [15:32:00.180] ..$ collapse: chr "; " [15:32:00.180] ..$ maxHead : int 3 [15:32:00.180] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:32:00.180] - attr(*, "where")=List of 1 [15:32:00.180] ..$ ...: [15:32:00.180] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:32:00.180] - attr(*, "resolved")= logi TRUE [15:32:00.180] - attr(*, "total_size")= num NA [15:32:00.186] - Getting '...' globals ... DONE [15:32:00.187] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:32:00.187] List of 2 [15:32:00.187] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [15:32:00.187] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [15:32:00.187] $ ... :List of 2 [15:32:00.187] ..$ collapse: chr "; " [15:32:00.187] ..$ maxHead : int 3 [15:32:00.187] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:32:00.187] - attr(*, "where")=List of 2 [15:32:00.187] ..$ ...future.FUN: [15:32:00.187] ..$ ... : [15:32:00.187] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:32:00.187] - attr(*, "resolved")= logi FALSE [15:32:00.187] - attr(*, "total_size")= num 71456 [15:32:00.194] Packages to be attached in all futures: [n=1] 'future' [15:32:00.194] getGlobalsAndPackagesXApply() ... DONE [15:32:00.195] Number of futures (= number of chunks): 1 [15:32:00.195] Launching 1 futures (chunks) ... [15:32:00.195] Chunk #1 of 1 ... [15:32:00.195] - Finding globals in 'X' for chunk #1 ... [15:32:00.196] getGlobalsAndPackages() ... [15:32:00.196] Searching for globals... [15:32:00.197] [15:32:00.197] Searching for globals ... DONE [15:32:00.197] - globals: [0] [15:32:00.197] getGlobalsAndPackages() ... DONE [15:32:00.198] + additional globals found: [n=0] [15:32:00.198] + additional namespaces needed: [n=0] [15:32:00.198] - Finding globals in 'X' for chunk #1 ... DONE [15:32:00.198] - seeds: [15:32:00.199] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:00.199] getGlobalsAndPackages() ... [15:32:00.199] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:00.200] Resolving globals: FALSE [15:32:00.200] Tweak future expression to call with '...' arguments ... [15:32:00.200] { [15:32:00.200] do.call(function(...) { [15:32:00.200] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:00.200] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:32:00.200] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:00.200] on.exit(options(oopts), add = TRUE) [15:32:00.200] } [15:32:00.200] { [15:32:00.200] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:32:00.200] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:00.200] ...future.FUN(...future.X_jj, ...) [15:32:00.200] }) [15:32:00.200] } [15:32:00.200] }, args = future.call.arguments) [15:32:00.200] } [15:32:00.201] Tweak future expression to call with '...' arguments ... DONE [15:32:00.202] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:00.202] - packages: [1] 'future' [15:32:00.203] getGlobalsAndPackages() ... DONE [15:32:00.203] run() for 'Future' ... [15:32:00.203] - state: 'created' [15:32:00.204] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:32:00.221] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:32:00.222] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:32:00.222] - Field: 'node' [15:32:00.223] - Field: 'label' [15:32:00.223] - Field: 'local' [15:32:00.223] - Field: 'owner' [15:32:00.223] - Field: 'envir' [15:32:00.224] - Field: 'workers' [15:32:00.224] - Field: 'packages' [15:32:00.224] - Field: 'gc' [15:32:00.225] - Field: 'conditions' [15:32:00.225] - Field: 'persistent' [15:32:00.225] - Field: 'expr' [15:32:00.225] - Field: 'uuid' [15:32:00.226] - Field: 'seed' [15:32:00.226] - Field: 'version' [15:32:00.226] - Field: 'result' [15:32:00.231] - Field: 'asynchronous' [15:32:00.231] - Field: 'calls' [15:32:00.231] - Field: 'globals' [15:32:00.232] - Field: 'stdout' [15:32:00.232] - Field: 'earlySignal' [15:32:00.232] - Field: 'lazy' [15:32:00.233] - Field: 'state' [15:32:00.233] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:32:00.233] - Launch lazy future ... [15:32:00.234] Packages needed by the future expression (n = 1): 'future' [15:32:00.234] Packages needed by future strategies (n = 0): [15:32:00.235] { [15:32:00.235] { [15:32:00.235] { [15:32:00.235] ...future.startTime <- base::Sys.time() [15:32:00.235] { [15:32:00.235] { [15:32:00.235] { [15:32:00.235] { [15:32:00.235] { [15:32:00.235] base::local({ [15:32:00.235] has_future <- base::requireNamespace("future", [15:32:00.235] quietly = TRUE) [15:32:00.235] if (has_future) { [15:32:00.235] ns <- base::getNamespace("future") [15:32:00.235] version <- ns[[".package"]][["version"]] [15:32:00.235] if (is.null(version)) [15:32:00.235] version <- utils::packageVersion("future") [15:32:00.235] } [15:32:00.235] else { [15:32:00.235] version <- NULL [15:32:00.235] } [15:32:00.235] if (!has_future || version < "1.8.0") { [15:32:00.235] info <- base::c(r_version = base::gsub("R version ", [15:32:00.235] "", base::R.version$version.string), [15:32:00.235] platform = base::sprintf("%s (%s-bit)", [15:32:00.235] base::R.version$platform, 8 * [15:32:00.235] base::.Machine$sizeof.pointer), [15:32:00.235] os = base::paste(base::Sys.info()[base::c("sysname", [15:32:00.235] "release", "version")], collapse = " "), [15:32:00.235] hostname = base::Sys.info()[["nodename"]]) [15:32:00.235] info <- base::sprintf("%s: %s", base::names(info), [15:32:00.235] info) [15:32:00.235] info <- base::paste(info, collapse = "; ") [15:32:00.235] if (!has_future) { [15:32:00.235] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:32:00.235] info) [15:32:00.235] } [15:32:00.235] else { [15:32:00.235] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:32:00.235] info, version) [15:32:00.235] } [15:32:00.235] base::stop(msg) [15:32:00.235] } [15:32:00.235] }) [15:32:00.235] } [15:32:00.235] ...future.mc.cores.old <- base::getOption("mc.cores") [15:32:00.235] base::options(mc.cores = 1L) [15:32:00.235] } [15:32:00.235] base::local({ [15:32:00.235] for (pkg in "future") { [15:32:00.235] base::loadNamespace(pkg) [15:32:00.235] base::library(pkg, character.only = TRUE) [15:32:00.235] } [15:32:00.235] }) [15:32:00.235] } [15:32:00.235] ...future.strategy.old <- future::plan("list") [15:32:00.235] options(future.plan = NULL) [15:32:00.235] Sys.unsetenv("R_FUTURE_PLAN") [15:32:00.235] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:32:00.235] } [15:32:00.235] ...future.workdir <- getwd() [15:32:00.235] } [15:32:00.235] ...future.oldOptions <- base::as.list(base::.Options) [15:32:00.235] ...future.oldEnvVars <- base::Sys.getenv() [15:32:00.235] } [15:32:00.235] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:32:00.235] future.globals.maxSize = NULL, future.globals.method = NULL, [15:32:00.235] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:32:00.235] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:32:00.235] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:32:00.235] future.stdout.windows.reencode = NULL, width = 80L) [15:32:00.235] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:32:00.235] base::names(...future.oldOptions)) [15:32:00.235] } [15:32:00.235] if (FALSE) { [15:32:00.235] } [15:32:00.235] else { [15:32:00.235] if (TRUE) { [15:32:00.235] ...future.stdout <- base::rawConnection(base::raw(0L), [15:32:00.235] open = "w") [15:32:00.235] } [15:32:00.235] else { [15:32:00.235] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:32:00.235] windows = "NUL", "/dev/null"), open = "w") [15:32:00.235] } [15:32:00.235] base::sink(...future.stdout, type = "output", split = FALSE) [15:32:00.235] base::on.exit(if (!base::is.null(...future.stdout)) { [15:32:00.235] base::sink(type = "output", split = FALSE) [15:32:00.235] base::close(...future.stdout) [15:32:00.235] }, add = TRUE) [15:32:00.235] } [15:32:00.235] ...future.frame <- base::sys.nframe() [15:32:00.235] ...future.conditions <- base::list() [15:32:00.235] ...future.rng <- base::globalenv()$.Random.seed [15:32:00.235] if (FALSE) { [15:32:00.235] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:32:00.235] "...future.value", "...future.globalenv.names", ".Random.seed") [15:32:00.235] } [15:32:00.235] ...future.result <- base::tryCatch({ [15:32:00.235] base::withCallingHandlers({ [15:32:00.235] ...future.value <- base::withVisible(base::local({ [15:32:00.235] ...future.makeSendCondition <- base::local({ [15:32:00.235] sendCondition <- NULL [15:32:00.235] function(frame = 1L) { [15:32:00.235] if (is.function(sendCondition)) [15:32:00.235] return(sendCondition) [15:32:00.235] ns <- getNamespace("parallel") [15:32:00.235] if (exists("sendData", mode = "function", [15:32:00.235] envir = ns)) { [15:32:00.235] parallel_sendData <- get("sendData", mode = "function", [15:32:00.235] envir = ns) [15:32:00.235] envir <- sys.frame(frame) [15:32:00.235] master <- NULL [15:32:00.235] while (!identical(envir, .GlobalEnv) && [15:32:00.235] !identical(envir, emptyenv())) { [15:32:00.235] if (exists("master", mode = "list", envir = envir, [15:32:00.235] inherits = FALSE)) { [15:32:00.235] master <- get("master", mode = "list", [15:32:00.235] envir = envir, inherits = FALSE) [15:32:00.235] if (inherits(master, c("SOCKnode", [15:32:00.235] "SOCK0node"))) { [15:32:00.235] sendCondition <<- function(cond) { [15:32:00.235] data <- list(type = "VALUE", value = cond, [15:32:00.235] success = TRUE) [15:32:00.235] parallel_sendData(master, data) [15:32:00.235] } [15:32:00.235] return(sendCondition) [15:32:00.235] } [15:32:00.235] } [15:32:00.235] frame <- frame + 1L [15:32:00.235] envir <- sys.frame(frame) [15:32:00.235] } [15:32:00.235] } [15:32:00.235] sendCondition <<- function(cond) NULL [15:32:00.235] } [15:32:00.235] }) [15:32:00.235] withCallingHandlers({ [15:32:00.235] { [15:32:00.235] do.call(function(...) { [15:32:00.235] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:00.235] if (!identical(...future.globals.maxSize.org, [15:32:00.235] ...future.globals.maxSize)) { [15:32:00.235] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:00.235] on.exit(options(oopts), add = TRUE) [15:32:00.235] } [15:32:00.235] { [15:32:00.235] lapply(seq_along(...future.elements_ii), [15:32:00.235] FUN = function(jj) { [15:32:00.235] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:00.235] ...future.FUN(...future.X_jj, ...) [15:32:00.235] }) [15:32:00.235] } [15:32:00.235] }, args = future.call.arguments) [15:32:00.235] } [15:32:00.235] }, immediateCondition = function(cond) { [15:32:00.235] sendCondition <- ...future.makeSendCondition() [15:32:00.235] sendCondition(cond) [15:32:00.235] muffleCondition <- function (cond, pattern = "^muffle") [15:32:00.235] { [15:32:00.235] inherits <- base::inherits [15:32:00.235] invokeRestart <- base::invokeRestart [15:32:00.235] is.null <- base::is.null [15:32:00.235] muffled <- FALSE [15:32:00.235] if (inherits(cond, "message")) { [15:32:00.235] muffled <- grepl(pattern, "muffleMessage") [15:32:00.235] if (muffled) [15:32:00.235] invokeRestart("muffleMessage") [15:32:00.235] } [15:32:00.235] else if (inherits(cond, "warning")) { [15:32:00.235] muffled <- grepl(pattern, "muffleWarning") [15:32:00.235] if (muffled) [15:32:00.235] invokeRestart("muffleWarning") [15:32:00.235] } [15:32:00.235] else if (inherits(cond, "condition")) { [15:32:00.235] if (!is.null(pattern)) { [15:32:00.235] computeRestarts <- base::computeRestarts [15:32:00.235] grepl <- base::grepl [15:32:00.235] restarts <- computeRestarts(cond) [15:32:00.235] for (restart in restarts) { [15:32:00.235] name <- restart$name [15:32:00.235] if (is.null(name)) [15:32:00.235] next [15:32:00.235] if (!grepl(pattern, name)) [15:32:00.235] next [15:32:00.235] invokeRestart(restart) [15:32:00.235] muffled <- TRUE [15:32:00.235] break [15:32:00.235] } [15:32:00.235] } [15:32:00.235] } [15:32:00.235] invisible(muffled) [15:32:00.235] } [15:32:00.235] muffleCondition(cond) [15:32:00.235] }) [15:32:00.235] })) [15:32:00.235] future::FutureResult(value = ...future.value$value, [15:32:00.235] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:32:00.235] ...future.rng), globalenv = if (FALSE) [15:32:00.235] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:32:00.235] ...future.globalenv.names)) [15:32:00.235] else NULL, started = ...future.startTime, version = "1.8") [15:32:00.235] }, condition = base::local({ [15:32:00.235] c <- base::c [15:32:00.235] inherits <- base::inherits [15:32:00.235] invokeRestart <- base::invokeRestart [15:32:00.235] length <- base::length [15:32:00.235] list <- base::list [15:32:00.235] seq.int <- base::seq.int [15:32:00.235] signalCondition <- base::signalCondition [15:32:00.235] sys.calls <- base::sys.calls [15:32:00.235] `[[` <- base::`[[` [15:32:00.235] `+` <- base::`+` [15:32:00.235] `<<-` <- base::`<<-` [15:32:00.235] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:32:00.235] calls[seq.int(from = from + 12L, to = length(calls) - [15:32:00.235] 3L)] [15:32:00.235] } [15:32:00.235] function(cond) { [15:32:00.235] is_error <- inherits(cond, "error") [15:32:00.235] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:32:00.235] NULL) [15:32:00.235] if (is_error) { [15:32:00.235] sessionInformation <- function() { [15:32:00.235] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:32:00.235] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:32:00.235] search = base::search(), system = base::Sys.info()) [15:32:00.235] } [15:32:00.235] ...future.conditions[[length(...future.conditions) + [15:32:00.235] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:32:00.235] cond$call), session = sessionInformation(), [15:32:00.235] timestamp = base::Sys.time(), signaled = 0L) [15:32:00.235] signalCondition(cond) [15:32:00.235] } [15:32:00.235] else if (!ignore && TRUE && inherits(cond, c("condition", [15:32:00.235] "immediateCondition"))) { [15:32:00.235] signal <- TRUE && inherits(cond, "immediateCondition") [15:32:00.235] ...future.conditions[[length(...future.conditions) + [15:32:00.235] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:32:00.235] if (TRUE && !signal) { [15:32:00.235] muffleCondition <- function (cond, pattern = "^muffle") [15:32:00.235] { [15:32:00.235] inherits <- base::inherits [15:32:00.235] invokeRestart <- base::invokeRestart [15:32:00.235] is.null <- base::is.null [15:32:00.235] muffled <- FALSE [15:32:00.235] if (inherits(cond, "message")) { [15:32:00.235] muffled <- grepl(pattern, "muffleMessage") [15:32:00.235] if (muffled) [15:32:00.235] invokeRestart("muffleMessage") [15:32:00.235] } [15:32:00.235] else if (inherits(cond, "warning")) { [15:32:00.235] muffled <- grepl(pattern, "muffleWarning") [15:32:00.235] if (muffled) [15:32:00.235] invokeRestart("muffleWarning") [15:32:00.235] } [15:32:00.235] else if (inherits(cond, "condition")) { [15:32:00.235] if (!is.null(pattern)) { [15:32:00.235] computeRestarts <- base::computeRestarts [15:32:00.235] grepl <- base::grepl [15:32:00.235] restarts <- computeRestarts(cond) [15:32:00.235] for (restart in restarts) { [15:32:00.235] name <- restart$name [15:32:00.235] if (is.null(name)) [15:32:00.235] next [15:32:00.235] if (!grepl(pattern, name)) [15:32:00.235] next [15:32:00.235] invokeRestart(restart) [15:32:00.235] muffled <- TRUE [15:32:00.235] break [15:32:00.235] } [15:32:00.235] } [15:32:00.235] } [15:32:00.235] invisible(muffled) [15:32:00.235] } [15:32:00.235] muffleCondition(cond, pattern = "^muffle") [15:32:00.235] } [15:32:00.235] } [15:32:00.235] else { [15:32:00.235] if (TRUE) { [15:32:00.235] muffleCondition <- function (cond, pattern = "^muffle") [15:32:00.235] { [15:32:00.235] inherits <- base::inherits [15:32:00.235] invokeRestart <- base::invokeRestart [15:32:00.235] is.null <- base::is.null [15:32:00.235] muffled <- FALSE [15:32:00.235] if (inherits(cond, "message")) { [15:32:00.235] muffled <- grepl(pattern, "muffleMessage") [15:32:00.235] if (muffled) [15:32:00.235] invokeRestart("muffleMessage") [15:32:00.235] } [15:32:00.235] else if (inherits(cond, "warning")) { [15:32:00.235] muffled <- grepl(pattern, "muffleWarning") [15:32:00.235] if (muffled) [15:32:00.235] invokeRestart("muffleWarning") [15:32:00.235] } [15:32:00.235] else if (inherits(cond, "condition")) { [15:32:00.235] if (!is.null(pattern)) { [15:32:00.235] computeRestarts <- base::computeRestarts [15:32:00.235] grepl <- base::grepl [15:32:00.235] restarts <- computeRestarts(cond) [15:32:00.235] for (restart in restarts) { [15:32:00.235] name <- restart$name [15:32:00.235] if (is.null(name)) [15:32:00.235] next [15:32:00.235] if (!grepl(pattern, name)) [15:32:00.235] next [15:32:00.235] invokeRestart(restart) [15:32:00.235] muffled <- TRUE [15:32:00.235] break [15:32:00.235] } [15:32:00.235] } [15:32:00.235] } [15:32:00.235] invisible(muffled) [15:32:00.235] } [15:32:00.235] muffleCondition(cond, pattern = "^muffle") [15:32:00.235] } [15:32:00.235] } [15:32:00.235] } [15:32:00.235] })) [15:32:00.235] }, error = function(ex) { [15:32:00.235] base::structure(base::list(value = NULL, visible = NULL, [15:32:00.235] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:32:00.235] ...future.rng), started = ...future.startTime, [15:32:00.235] finished = Sys.time(), session_uuid = NA_character_, [15:32:00.235] version = "1.8"), class = "FutureResult") [15:32:00.235] }, finally = { [15:32:00.235] if (!identical(...future.workdir, getwd())) [15:32:00.235] setwd(...future.workdir) [15:32:00.235] { [15:32:00.235] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:32:00.235] ...future.oldOptions$nwarnings <- NULL [15:32:00.235] } [15:32:00.235] base::options(...future.oldOptions) [15:32:00.235] if (.Platform$OS.type == "windows") { [15:32:00.235] old_names <- names(...future.oldEnvVars) [15:32:00.235] envs <- base::Sys.getenv() [15:32:00.235] names <- names(envs) [15:32:00.235] common <- intersect(names, old_names) [15:32:00.235] added <- setdiff(names, old_names) [15:32:00.235] removed <- setdiff(old_names, names) [15:32:00.235] changed <- common[...future.oldEnvVars[common] != [15:32:00.235] envs[common]] [15:32:00.235] NAMES <- toupper(changed) [15:32:00.235] args <- list() [15:32:00.235] for (kk in seq_along(NAMES)) { [15:32:00.235] name <- changed[[kk]] [15:32:00.235] NAME <- NAMES[[kk]] [15:32:00.235] if (name != NAME && is.element(NAME, old_names)) [15:32:00.235] next [15:32:00.235] args[[name]] <- ...future.oldEnvVars[[name]] [15:32:00.235] } [15:32:00.235] NAMES <- toupper(added) [15:32:00.235] for (kk in seq_along(NAMES)) { [15:32:00.235] name <- added[[kk]] [15:32:00.235] NAME <- NAMES[[kk]] [15:32:00.235] if (name != NAME && is.element(NAME, old_names)) [15:32:00.235] next [15:32:00.235] args[[name]] <- "" [15:32:00.235] } [15:32:00.235] NAMES <- toupper(removed) [15:32:00.235] for (kk in seq_along(NAMES)) { [15:32:00.235] name <- removed[[kk]] [15:32:00.235] NAME <- NAMES[[kk]] [15:32:00.235] if (name != NAME && is.element(NAME, old_names)) [15:32:00.235] next [15:32:00.235] args[[name]] <- ...future.oldEnvVars[[name]] [15:32:00.235] } [15:32:00.235] if (length(args) > 0) [15:32:00.235] base::do.call(base::Sys.setenv, args = args) [15:32:00.235] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:32:00.235] } [15:32:00.235] else { [15:32:00.235] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:32:00.235] } [15:32:00.235] { [15:32:00.235] if (base::length(...future.futureOptionsAdded) > [15:32:00.235] 0L) { [15:32:00.235] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:32:00.235] base::names(opts) <- ...future.futureOptionsAdded [15:32:00.235] base::options(opts) [15:32:00.235] } [15:32:00.235] { [15:32:00.235] { [15:32:00.235] base::options(mc.cores = ...future.mc.cores.old) [15:32:00.235] NULL [15:32:00.235] } [15:32:00.235] options(future.plan = NULL) [15:32:00.235] if (is.na(NA_character_)) [15:32:00.235] Sys.unsetenv("R_FUTURE_PLAN") [15:32:00.235] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:32:00.235] future::plan(...future.strategy.old, .cleanup = FALSE, [15:32:00.235] .init = FALSE) [15:32:00.235] } [15:32:00.235] } [15:32:00.235] } [15:32:00.235] }) [15:32:00.235] if (TRUE) { [15:32:00.235] base::sink(type = "output", split = FALSE) [15:32:00.235] if (TRUE) { [15:32:00.235] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:32:00.235] } [15:32:00.235] else { [15:32:00.235] ...future.result["stdout"] <- base::list(NULL) [15:32:00.235] } [15:32:00.235] base::close(...future.stdout) [15:32:00.235] ...future.stdout <- NULL [15:32:00.235] } [15:32:00.235] ...future.result$conditions <- ...future.conditions [15:32:00.235] ...future.result$finished <- base::Sys.time() [15:32:00.235] ...future.result [15:32:00.235] } [15:32:00.245] Exporting 5 global objects (69.78 KiB) to cluster node #1 ... [15:32:00.246] Exporting '...future.FUN' (69.62 KiB) to cluster node #1 ... [15:32:00.247] Exporting '...future.FUN' (69.62 KiB) to cluster node #1 ... DONE [15:32:00.248] Exporting 'future.call.arguments' (168 bytes) to cluster node #1 ... [15:32:00.249] Exporting 'future.call.arguments' (168 bytes) to cluster node #1 ... DONE [15:32:00.249] Exporting '...future.elements_ii' (12.83 KiB) to cluster node #1 ... [15:32:00.250] Exporting '...future.elements_ii' (12.83 KiB) to cluster node #1 ... DONE [15:32:00.250] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:32:00.251] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:32:00.251] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:32:00.252] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:32:00.252] Exporting 5 global objects (69.78 KiB) to cluster node #1 ... DONE [15:32:00.253] MultisessionFuture started [15:32:00.253] - Launch lazy future ... done [15:32:00.254] run() for 'MultisessionFuture' ... done [15:32:00.254] Created future: [15:32:00.286] receiveMessageFromWorker() for ClusterFuture ... [15:32:00.286] - Validating connection of MultisessionFuture [15:32:00.287] - received message: FutureResult [15:32:00.287] - Received FutureResult [15:32:00.287] - Erased future from FutureRegistry [15:32:00.288] result() for ClusterFuture ... [15:32:00.288] - result already collected: FutureResult [15:32:00.288] result() for ClusterFuture ... done [15:32:00.289] receiveMessageFromWorker() for ClusterFuture ... done [15:32:00.254] MultisessionFuture: [15:32:00.254] Label: 'future_lapply-1' [15:32:00.254] Expression: [15:32:00.254] { [15:32:00.254] do.call(function(...) { [15:32:00.254] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:00.254] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:32:00.254] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:00.254] on.exit(options(oopts), add = TRUE) [15:32:00.254] } [15:32:00.254] { [15:32:00.254] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:32:00.254] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:00.254] ...future.FUN(...future.X_jj, ...) [15:32:00.254] }) [15:32:00.254] } [15:32:00.254] }, args = future.call.arguments) [15:32:00.254] } [15:32:00.254] Lazy evaluation: FALSE [15:32:00.254] Asynchronous evaluation: TRUE [15:32:00.254] Local evaluation: TRUE [15:32:00.254] Environment: R_GlobalEnv [15:32:00.254] Capture standard output: TRUE [15:32:00.254] Capture condition classes: 'condition' (excluding 'nothing') [15:32:00.254] Globals: 5 objects totaling 82.61 KiB (function '...future.FUN' of 69.62 KiB, DotDotDotList 'future.call.arguments' of 168 bytes, list '...future.elements_ii' of 12.83 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:32:00.254] Packages: 1 packages ('future') [15:32:00.254] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:32:00.254] Resolved: TRUE [15:32:00.254] Value: [15:32:00.254] Conditions captured: [15:32:00.254] Early signaling: FALSE [15:32:00.254] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:32:00.254] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:32:00.289] Chunk #1 of 1 ... DONE [15:32:00.290] Launching 1 futures (chunks) ... DONE [15:32:00.290] Resolving 1 futures (chunks) ... [15:32:00.290] resolve() on list ... [15:32:00.291] recursive: 0 [15:32:00.291] length: 1 [15:32:00.291] [15:32:00.291] Future #1 [15:32:00.292] result() for ClusterFuture ... [15:32:00.292] - result already collected: FutureResult [15:32:00.292] result() for ClusterFuture ... done [15:32:00.293] result() for ClusterFuture ... [15:32:00.293] - result already collected: FutureResult [15:32:00.293] result() for ClusterFuture ... done [15:32:00.294] signalConditionsASAP(MultisessionFuture, pos=1) ... [15:32:00.294] - nx: 1 [15:32:00.294] - relay: TRUE [15:32:00.294] - stdout: TRUE [15:32:00.295] - signal: TRUE [15:32:00.295] - resignal: FALSE [15:32:00.295] - force: TRUE [15:32:00.295] - relayed: [n=1] FALSE [15:32:00.296] - queued futures: [n=1] FALSE [15:32:00.296] - until=1 [15:32:00.296] - relaying element #1 [15:32:00.297] result() for ClusterFuture ... [15:32:00.297] - result already collected: FutureResult [15:32:00.297] result() for ClusterFuture ... done [15:32:00.298] result() for ClusterFuture ... [15:32:00.298] - result already collected: FutureResult [15:32:00.298] result() for ClusterFuture ... done [15:32:00.299] result() for ClusterFuture ... [15:32:00.299] - result already collected: FutureResult [15:32:00.299] result() for ClusterFuture ... done [15:32:00.299] result() for ClusterFuture ... [15:32:00.300] - result already collected: FutureResult [15:32:00.300] result() for ClusterFuture ... done [15:32:00.300] - relayed: [n=1] TRUE [15:32:00.301] - queued futures: [n=1] TRUE [15:32:00.301] signalConditionsASAP(MultisessionFuture, pos=1) ... done [15:32:00.301] length: 0 (resolved future 1) [15:32:00.302] Relaying remaining futures [15:32:00.302] signalConditionsASAP(NULL, pos=0) ... [15:32:00.302] - nx: 1 [15:32:00.302] - relay: TRUE [15:32:00.303] - stdout: TRUE [15:32:00.303] - signal: TRUE [15:32:00.303] - resignal: FALSE [15:32:00.303] - force: TRUE [15:32:00.304] - relayed: [n=1] TRUE [15:32:00.304] - queued futures: [n=1] TRUE - flush all [15:32:00.304] - relayed: [n=1] TRUE [15:32:00.305] - queued futures: [n=1] TRUE [15:32:00.305] signalConditionsASAP(NULL, pos=0) ... done [15:32:00.305] resolve() on list ... DONE [15:32:00.306] result() for ClusterFuture ... [15:32:00.306] - result already collected: FutureResult [15:32:00.306] result() for ClusterFuture ... done [15:32:00.307] result() for ClusterFuture ... [15:32:00.307] - result already collected: FutureResult [15:32:00.307] result() for ClusterFuture ... done [15:32:00.307] - Number of value chunks collected: 1 [15:32:00.308] Resolving 1 futures (chunks) ... DONE [15:32:00.308] Reducing values from 1 chunks ... [15:32:00.308] - Number of values collected after concatenation: 1 [15:32:00.309] - Number of values expected: 1 [15:32:00.309] Reducing values from 1 chunks ... DONE [15:32:00.309] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [15:32:00.311] future_lapply() ... [15:32:00.317] Number of chunks: 2 [15:32:00.317] Index remapping (attribute 'ordering'): [n = 2] 2, 1 [15:32:00.318] getGlobalsAndPackagesXApply() ... [15:32:00.318] - future.globals: TRUE [15:32:00.318] getGlobalsAndPackages() ... [15:32:00.318] Searching for globals... [15:32:00.321] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [15:32:00.321] Searching for globals ... DONE [15:32:00.321] Resolving globals: FALSE [15:32:00.322] The total size of the 1 globals is 4.85 KiB (4968 bytes) [15:32:00.323] The total size of the 1 globals exported for future expression ('FUN()') is 4.85 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (4.85 KiB of class 'function') [15:32:00.323] - globals: [1] 'FUN' [15:32:00.324] - packages: [1] 'listenv' [15:32:00.324] getGlobalsAndPackages() ... DONE [15:32:00.324] - globals found/used: [n=1] 'FUN' [15:32:00.324] - needed namespaces: [n=1] 'listenv' [15:32:00.325] Finding globals ... DONE [15:32:00.325] - use_args: TRUE [15:32:00.325] - Getting '...' globals ... [15:32:00.326] resolve() on list ... [15:32:00.326] recursive: 0 [15:32:00.326] length: 1 [15:32:00.326] elements: '...' [15:32:00.327] length: 0 (resolved future 1) [15:32:00.327] resolve() on list ... DONE [15:32:00.327] - '...' content: [n=0] [15:32:00.327] List of 1 [15:32:00.327] $ ...: list() [15:32:00.327] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:32:00.327] - attr(*, "where")=List of 1 [15:32:00.327] ..$ ...: [15:32:00.327] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:32:00.327] - attr(*, "resolved")= logi TRUE [15:32:00.327] - attr(*, "total_size")= num NA [15:32:00.332] - Getting '...' globals ... DONE [15:32:00.333] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:32:00.333] List of 2 [15:32:00.333] $ ...future.FUN:function (x, ...) [15:32:00.333] $ ... : list() [15:32:00.333] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:32:00.333] - attr(*, "where")=List of 2 [15:32:00.333] ..$ ...future.FUN: [15:32:00.333] ..$ ... : [15:32:00.333] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:32:00.333] - attr(*, "resolved")= logi FALSE [15:32:00.333] - attr(*, "total_size")= num 4968 [15:32:00.338] Packages to be attached in all futures: [n=1] 'listenv' [15:32:00.339] getGlobalsAndPackagesXApply() ... DONE [15:32:00.339] Number of futures (= number of chunks): 2 [15:32:00.339] Launching 2 futures (chunks) ... [15:32:00.340] Chunk #1 of 2 ... [15:32:00.340] - Finding globals in 'X' for chunk #1 ... [15:32:00.340] getGlobalsAndPackages() ... [15:32:00.341] Searching for globals... [15:32:00.342] [15:32:00.342] Searching for globals ... DONE [15:32:00.342] - globals: [0] [15:32:00.342] getGlobalsAndPackages() ... DONE [15:32:00.343] + additional globals found: [n=0] [15:32:00.343] + additional namespaces needed: [n=0] [15:32:00.343] - Finding globals in 'X' for chunk #1 ... DONE [15:32:00.343] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:32:00.344] - seeds: [15:32:00.344] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:00.344] getGlobalsAndPackages() ... [15:32:00.345] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:00.345] Resolving globals: FALSE [15:32:00.345] Tweak future expression to call with '...' arguments ... [15:32:00.346] { [15:32:00.346] do.call(function(...) { [15:32:00.346] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:00.346] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:32:00.346] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:00.346] on.exit(options(oopts), add = TRUE) [15:32:00.346] } [15:32:00.346] { [15:32:00.346] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:32:00.346] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:00.346] ...future.FUN(...future.X_jj, ...) [15:32:00.346] }) [15:32:00.346] } [15:32:00.346] }, args = future.call.arguments) [15:32:00.346] } [15:32:00.346] Tweak future expression to call with '...' arguments ... DONE [15:32:00.347] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:00.348] - packages: [1] 'listenv' [15:32:00.348] getGlobalsAndPackages() ... DONE [15:32:00.348] run() for 'Future' ... [15:32:00.349] - state: 'created' [15:32:00.349] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:32:00.366] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:32:00.367] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:32:00.367] - Field: 'node' [15:32:00.367] - Field: 'label' [15:32:00.368] - Field: 'local' [15:32:00.368] - Field: 'owner' [15:32:00.368] - Field: 'envir' [15:32:00.368] - Field: 'workers' [15:32:00.369] - Field: 'packages' [15:32:00.369] - Field: 'gc' [15:32:00.369] - Field: 'conditions' [15:32:00.369] - Field: 'persistent' [15:32:00.370] - Field: 'expr' [15:32:00.370] - Field: 'uuid' [15:32:00.370] - Field: 'seed' [15:32:00.371] - Field: 'version' [15:32:00.371] - Field: 'result' [15:32:00.371] - Field: 'asynchronous' [15:32:00.371] - Field: 'calls' [15:32:00.372] - Field: 'globals' [15:32:00.372] - Field: 'stdout' [15:32:00.372] - Field: 'earlySignal' [15:32:00.372] - Field: 'lazy' [15:32:00.373] - Field: 'state' [15:32:00.373] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:32:00.374] - Launch lazy future ... [15:32:00.374] Packages needed by the future expression (n = 1): 'listenv' [15:32:00.374] Packages needed by future strategies (n = 0): [15:32:00.376] { [15:32:00.376] { [15:32:00.376] { [15:32:00.376] ...future.startTime <- base::Sys.time() [15:32:00.376] { [15:32:00.376] { [15:32:00.376] { [15:32:00.376] { [15:32:00.376] { [15:32:00.376] base::local({ [15:32:00.376] has_future <- base::requireNamespace("future", [15:32:00.376] quietly = TRUE) [15:32:00.376] if (has_future) { [15:32:00.376] ns <- base::getNamespace("future") [15:32:00.376] version <- ns[[".package"]][["version"]] [15:32:00.376] if (is.null(version)) [15:32:00.376] version <- utils::packageVersion("future") [15:32:00.376] } [15:32:00.376] else { [15:32:00.376] version <- NULL [15:32:00.376] } [15:32:00.376] if (!has_future || version < "1.8.0") { [15:32:00.376] info <- base::c(r_version = base::gsub("R version ", [15:32:00.376] "", base::R.version$version.string), [15:32:00.376] platform = base::sprintf("%s (%s-bit)", [15:32:00.376] base::R.version$platform, 8 * [15:32:00.376] base::.Machine$sizeof.pointer), [15:32:00.376] os = base::paste(base::Sys.info()[base::c("sysname", [15:32:00.376] "release", "version")], collapse = " "), [15:32:00.376] hostname = base::Sys.info()[["nodename"]]) [15:32:00.376] info <- base::sprintf("%s: %s", base::names(info), [15:32:00.376] info) [15:32:00.376] info <- base::paste(info, collapse = "; ") [15:32:00.376] if (!has_future) { [15:32:00.376] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:32:00.376] info) [15:32:00.376] } [15:32:00.376] else { [15:32:00.376] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:32:00.376] info, version) [15:32:00.376] } [15:32:00.376] base::stop(msg) [15:32:00.376] } [15:32:00.376] }) [15:32:00.376] } [15:32:00.376] ...future.mc.cores.old <- base::getOption("mc.cores") [15:32:00.376] base::options(mc.cores = 1L) [15:32:00.376] } [15:32:00.376] base::local({ [15:32:00.376] for (pkg in "listenv") { [15:32:00.376] base::loadNamespace(pkg) [15:32:00.376] base::library(pkg, character.only = TRUE) [15:32:00.376] } [15:32:00.376] }) [15:32:00.376] } [15:32:00.376] ...future.strategy.old <- future::plan("list") [15:32:00.376] options(future.plan = NULL) [15:32:00.376] Sys.unsetenv("R_FUTURE_PLAN") [15:32:00.376] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:32:00.376] } [15:32:00.376] ...future.workdir <- getwd() [15:32:00.376] } [15:32:00.376] ...future.oldOptions <- base::as.list(base::.Options) [15:32:00.376] ...future.oldEnvVars <- base::Sys.getenv() [15:32:00.376] } [15:32:00.376] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:32:00.376] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:32:00.376] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:32:00.376] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:32:00.376] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:32:00.376] future.stdout.windows.reencode = NULL, width = 80L) [15:32:00.376] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:32:00.376] base::names(...future.oldOptions)) [15:32:00.376] } [15:32:00.376] if (FALSE) { [15:32:00.376] } [15:32:00.376] else { [15:32:00.376] if (TRUE) { [15:32:00.376] ...future.stdout <- base::rawConnection(base::raw(0L), [15:32:00.376] open = "w") [15:32:00.376] } [15:32:00.376] else { [15:32:00.376] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:32:00.376] windows = "NUL", "/dev/null"), open = "w") [15:32:00.376] } [15:32:00.376] base::sink(...future.stdout, type = "output", split = FALSE) [15:32:00.376] base::on.exit(if (!base::is.null(...future.stdout)) { [15:32:00.376] base::sink(type = "output", split = FALSE) [15:32:00.376] base::close(...future.stdout) [15:32:00.376] }, add = TRUE) [15:32:00.376] } [15:32:00.376] ...future.frame <- base::sys.nframe() [15:32:00.376] ...future.conditions <- base::list() [15:32:00.376] ...future.rng <- base::globalenv()$.Random.seed [15:32:00.376] if (FALSE) { [15:32:00.376] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:32:00.376] "...future.value", "...future.globalenv.names", ".Random.seed") [15:32:00.376] } [15:32:00.376] ...future.result <- base::tryCatch({ [15:32:00.376] base::withCallingHandlers({ [15:32:00.376] ...future.value <- base::withVisible(base::local({ [15:32:00.376] ...future.makeSendCondition <- base::local({ [15:32:00.376] sendCondition <- NULL [15:32:00.376] function(frame = 1L) { [15:32:00.376] if (is.function(sendCondition)) [15:32:00.376] return(sendCondition) [15:32:00.376] ns <- getNamespace("parallel") [15:32:00.376] if (exists("sendData", mode = "function", [15:32:00.376] envir = ns)) { [15:32:00.376] parallel_sendData <- get("sendData", mode = "function", [15:32:00.376] envir = ns) [15:32:00.376] envir <- sys.frame(frame) [15:32:00.376] master <- NULL [15:32:00.376] while (!identical(envir, .GlobalEnv) && [15:32:00.376] !identical(envir, emptyenv())) { [15:32:00.376] if (exists("master", mode = "list", envir = envir, [15:32:00.376] inherits = FALSE)) { [15:32:00.376] master <- get("master", mode = "list", [15:32:00.376] envir = envir, inherits = FALSE) [15:32:00.376] if (inherits(master, c("SOCKnode", [15:32:00.376] "SOCK0node"))) { [15:32:00.376] sendCondition <<- function(cond) { [15:32:00.376] data <- list(type = "VALUE", value = cond, [15:32:00.376] success = TRUE) [15:32:00.376] parallel_sendData(master, data) [15:32:00.376] } [15:32:00.376] return(sendCondition) [15:32:00.376] } [15:32:00.376] } [15:32:00.376] frame <- frame + 1L [15:32:00.376] envir <- sys.frame(frame) [15:32:00.376] } [15:32:00.376] } [15:32:00.376] sendCondition <<- function(cond) NULL [15:32:00.376] } [15:32:00.376] }) [15:32:00.376] withCallingHandlers({ [15:32:00.376] { [15:32:00.376] do.call(function(...) { [15:32:00.376] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:00.376] if (!identical(...future.globals.maxSize.org, [15:32:00.376] ...future.globals.maxSize)) { [15:32:00.376] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:00.376] on.exit(options(oopts), add = TRUE) [15:32:00.376] } [15:32:00.376] { [15:32:00.376] lapply(seq_along(...future.elements_ii), [15:32:00.376] FUN = function(jj) { [15:32:00.376] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:00.376] ...future.FUN(...future.X_jj, ...) [15:32:00.376] }) [15:32:00.376] } [15:32:00.376] }, args = future.call.arguments) [15:32:00.376] } [15:32:00.376] }, immediateCondition = function(cond) { [15:32:00.376] sendCondition <- ...future.makeSendCondition() [15:32:00.376] sendCondition(cond) [15:32:00.376] muffleCondition <- function (cond, pattern = "^muffle") [15:32:00.376] { [15:32:00.376] inherits <- base::inherits [15:32:00.376] invokeRestart <- base::invokeRestart [15:32:00.376] is.null <- base::is.null [15:32:00.376] muffled <- FALSE [15:32:00.376] if (inherits(cond, "message")) { [15:32:00.376] muffled <- grepl(pattern, "muffleMessage") [15:32:00.376] if (muffled) [15:32:00.376] invokeRestart("muffleMessage") [15:32:00.376] } [15:32:00.376] else if (inherits(cond, "warning")) { [15:32:00.376] muffled <- grepl(pattern, "muffleWarning") [15:32:00.376] if (muffled) [15:32:00.376] invokeRestart("muffleWarning") [15:32:00.376] } [15:32:00.376] else if (inherits(cond, "condition")) { [15:32:00.376] if (!is.null(pattern)) { [15:32:00.376] computeRestarts <- base::computeRestarts [15:32:00.376] grepl <- base::grepl [15:32:00.376] restarts <- computeRestarts(cond) [15:32:00.376] for (restart in restarts) { [15:32:00.376] name <- restart$name [15:32:00.376] if (is.null(name)) [15:32:00.376] next [15:32:00.376] if (!grepl(pattern, name)) [15:32:00.376] next [15:32:00.376] invokeRestart(restart) [15:32:00.376] muffled <- TRUE [15:32:00.376] break [15:32:00.376] } [15:32:00.376] } [15:32:00.376] } [15:32:00.376] invisible(muffled) [15:32:00.376] } [15:32:00.376] muffleCondition(cond) [15:32:00.376] }) [15:32:00.376] })) [15:32:00.376] future::FutureResult(value = ...future.value$value, [15:32:00.376] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:32:00.376] ...future.rng), globalenv = if (FALSE) [15:32:00.376] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:32:00.376] ...future.globalenv.names)) [15:32:00.376] else NULL, started = ...future.startTime, version = "1.8") [15:32:00.376] }, condition = base::local({ [15:32:00.376] c <- base::c [15:32:00.376] inherits <- base::inherits [15:32:00.376] invokeRestart <- base::invokeRestart [15:32:00.376] length <- base::length [15:32:00.376] list <- base::list [15:32:00.376] seq.int <- base::seq.int [15:32:00.376] signalCondition <- base::signalCondition [15:32:00.376] sys.calls <- base::sys.calls [15:32:00.376] `[[` <- base::`[[` [15:32:00.376] `+` <- base::`+` [15:32:00.376] `<<-` <- base::`<<-` [15:32:00.376] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:32:00.376] calls[seq.int(from = from + 12L, to = length(calls) - [15:32:00.376] 3L)] [15:32:00.376] } [15:32:00.376] function(cond) { [15:32:00.376] is_error <- inherits(cond, "error") [15:32:00.376] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:32:00.376] NULL) [15:32:00.376] if (is_error) { [15:32:00.376] sessionInformation <- function() { [15:32:00.376] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:32:00.376] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:32:00.376] search = base::search(), system = base::Sys.info()) [15:32:00.376] } [15:32:00.376] ...future.conditions[[length(...future.conditions) + [15:32:00.376] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:32:00.376] cond$call), session = sessionInformation(), [15:32:00.376] timestamp = base::Sys.time(), signaled = 0L) [15:32:00.376] signalCondition(cond) [15:32:00.376] } [15:32:00.376] else if (!ignore && TRUE && inherits(cond, c("condition", [15:32:00.376] "immediateCondition"))) { [15:32:00.376] signal <- TRUE && inherits(cond, "immediateCondition") [15:32:00.376] ...future.conditions[[length(...future.conditions) + [15:32:00.376] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:32:00.376] if (TRUE && !signal) { [15:32:00.376] muffleCondition <- function (cond, pattern = "^muffle") [15:32:00.376] { [15:32:00.376] inherits <- base::inherits [15:32:00.376] invokeRestart <- base::invokeRestart [15:32:00.376] is.null <- base::is.null [15:32:00.376] muffled <- FALSE [15:32:00.376] if (inherits(cond, "message")) { [15:32:00.376] muffled <- grepl(pattern, "muffleMessage") [15:32:00.376] if (muffled) [15:32:00.376] invokeRestart("muffleMessage") [15:32:00.376] } [15:32:00.376] else if (inherits(cond, "warning")) { [15:32:00.376] muffled <- grepl(pattern, "muffleWarning") [15:32:00.376] if (muffled) [15:32:00.376] invokeRestart("muffleWarning") [15:32:00.376] } [15:32:00.376] else if (inherits(cond, "condition")) { [15:32:00.376] if (!is.null(pattern)) { [15:32:00.376] computeRestarts <- base::computeRestarts [15:32:00.376] grepl <- base::grepl [15:32:00.376] restarts <- computeRestarts(cond) [15:32:00.376] for (restart in restarts) { [15:32:00.376] name <- restart$name [15:32:00.376] if (is.null(name)) [15:32:00.376] next [15:32:00.376] if (!grepl(pattern, name)) [15:32:00.376] next [15:32:00.376] invokeRestart(restart) [15:32:00.376] muffled <- TRUE [15:32:00.376] break [15:32:00.376] } [15:32:00.376] } [15:32:00.376] } [15:32:00.376] invisible(muffled) [15:32:00.376] } [15:32:00.376] muffleCondition(cond, pattern = "^muffle") [15:32:00.376] } [15:32:00.376] } [15:32:00.376] else { [15:32:00.376] if (TRUE) { [15:32:00.376] muffleCondition <- function (cond, pattern = "^muffle") [15:32:00.376] { [15:32:00.376] inherits <- base::inherits [15:32:00.376] invokeRestart <- base::invokeRestart [15:32:00.376] is.null <- base::is.null [15:32:00.376] muffled <- FALSE [15:32:00.376] if (inherits(cond, "message")) { [15:32:00.376] muffled <- grepl(pattern, "muffleMessage") [15:32:00.376] if (muffled) [15:32:00.376] invokeRestart("muffleMessage") [15:32:00.376] } [15:32:00.376] else if (inherits(cond, "warning")) { [15:32:00.376] muffled <- grepl(pattern, "muffleWarning") [15:32:00.376] if (muffled) [15:32:00.376] invokeRestart("muffleWarning") [15:32:00.376] } [15:32:00.376] else if (inherits(cond, "condition")) { [15:32:00.376] if (!is.null(pattern)) { [15:32:00.376] computeRestarts <- base::computeRestarts [15:32:00.376] grepl <- base::grepl [15:32:00.376] restarts <- computeRestarts(cond) [15:32:00.376] for (restart in restarts) { [15:32:00.376] name <- restart$name [15:32:00.376] if (is.null(name)) [15:32:00.376] next [15:32:00.376] if (!grepl(pattern, name)) [15:32:00.376] next [15:32:00.376] invokeRestart(restart) [15:32:00.376] muffled <- TRUE [15:32:00.376] break [15:32:00.376] } [15:32:00.376] } [15:32:00.376] } [15:32:00.376] invisible(muffled) [15:32:00.376] } [15:32:00.376] muffleCondition(cond, pattern = "^muffle") [15:32:00.376] } [15:32:00.376] } [15:32:00.376] } [15:32:00.376] })) [15:32:00.376] }, error = function(ex) { [15:32:00.376] base::structure(base::list(value = NULL, visible = NULL, [15:32:00.376] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:32:00.376] ...future.rng), started = ...future.startTime, [15:32:00.376] finished = Sys.time(), session_uuid = NA_character_, [15:32:00.376] version = "1.8"), class = "FutureResult") [15:32:00.376] }, finally = { [15:32:00.376] if (!identical(...future.workdir, getwd())) [15:32:00.376] setwd(...future.workdir) [15:32:00.376] { [15:32:00.376] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:32:00.376] ...future.oldOptions$nwarnings <- NULL [15:32:00.376] } [15:32:00.376] base::options(...future.oldOptions) [15:32:00.376] if (.Platform$OS.type == "windows") { [15:32:00.376] old_names <- names(...future.oldEnvVars) [15:32:00.376] envs <- base::Sys.getenv() [15:32:00.376] names <- names(envs) [15:32:00.376] common <- intersect(names, old_names) [15:32:00.376] added <- setdiff(names, old_names) [15:32:00.376] removed <- setdiff(old_names, names) [15:32:00.376] changed <- common[...future.oldEnvVars[common] != [15:32:00.376] envs[common]] [15:32:00.376] NAMES <- toupper(changed) [15:32:00.376] args <- list() [15:32:00.376] for (kk in seq_along(NAMES)) { [15:32:00.376] name <- changed[[kk]] [15:32:00.376] NAME <- NAMES[[kk]] [15:32:00.376] if (name != NAME && is.element(NAME, old_names)) [15:32:00.376] next [15:32:00.376] args[[name]] <- ...future.oldEnvVars[[name]] [15:32:00.376] } [15:32:00.376] NAMES <- toupper(added) [15:32:00.376] for (kk in seq_along(NAMES)) { [15:32:00.376] name <- added[[kk]] [15:32:00.376] NAME <- NAMES[[kk]] [15:32:00.376] if (name != NAME && is.element(NAME, old_names)) [15:32:00.376] next [15:32:00.376] args[[name]] <- "" [15:32:00.376] } [15:32:00.376] NAMES <- toupper(removed) [15:32:00.376] for (kk in seq_along(NAMES)) { [15:32:00.376] name <- removed[[kk]] [15:32:00.376] NAME <- NAMES[[kk]] [15:32:00.376] if (name != NAME && is.element(NAME, old_names)) [15:32:00.376] next [15:32:00.376] args[[name]] <- ...future.oldEnvVars[[name]] [15:32:00.376] } [15:32:00.376] if (length(args) > 0) [15:32:00.376] base::do.call(base::Sys.setenv, args = args) [15:32:00.376] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:32:00.376] } [15:32:00.376] else { [15:32:00.376] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:32:00.376] } [15:32:00.376] { [15:32:00.376] if (base::length(...future.futureOptionsAdded) > [15:32:00.376] 0L) { [15:32:00.376] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:32:00.376] base::names(opts) <- ...future.futureOptionsAdded [15:32:00.376] base::options(opts) [15:32:00.376] } [15:32:00.376] { [15:32:00.376] { [15:32:00.376] base::options(mc.cores = ...future.mc.cores.old) [15:32:00.376] NULL [15:32:00.376] } [15:32:00.376] options(future.plan = NULL) [15:32:00.376] if (is.na(NA_character_)) [15:32:00.376] Sys.unsetenv("R_FUTURE_PLAN") [15:32:00.376] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:32:00.376] future::plan(...future.strategy.old, .cleanup = FALSE, [15:32:00.376] .init = FALSE) [15:32:00.376] } [15:32:00.376] } [15:32:00.376] } [15:32:00.376] }) [15:32:00.376] if (TRUE) { [15:32:00.376] base::sink(type = "output", split = FALSE) [15:32:00.376] if (TRUE) { [15:32:00.376] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:32:00.376] } [15:32:00.376] else { [15:32:00.376] ...future.result["stdout"] <- base::list(NULL) [15:32:00.376] } [15:32:00.376] base::close(...future.stdout) [15:32:00.376] ...future.stdout <- NULL [15:32:00.376] } [15:32:00.376] ...future.result$conditions <- ...future.conditions [15:32:00.376] ...future.result$finished <- base::Sys.time() [15:32:00.376] ...future.result [15:32:00.376] } [15:32:00.385] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... [15:32:00.386] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... [15:32:00.387] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... DONE [15:32:00.387] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [15:32:00.388] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [15:32:00.389] Exporting '...future.elements_ii' (12.94 KiB) to cluster node #1 ... [15:32:00.389] Exporting '...future.elements_ii' (12.94 KiB) to cluster node #1 ... DONE [15:32:00.390] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:32:00.390] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:32:00.391] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:32:00.391] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:32:00.392] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... DONE [15:32:00.393] MultisessionFuture started [15:32:00.393] - Launch lazy future ... done [15:32:00.393] run() for 'MultisessionFuture' ... done [15:32:00.393] Created future: [15:32:00.424] receiveMessageFromWorker() for ClusterFuture ... [15:32:00.424] - Validating connection of MultisessionFuture [15:32:00.425] - received message: FutureResult [15:32:00.425] - Received FutureResult [15:32:00.425] - Erased future from FutureRegistry [15:32:00.426] result() for ClusterFuture ... [15:32:00.426] - result already collected: FutureResult [15:32:00.426] result() for ClusterFuture ... done [15:32:00.426] receiveMessageFromWorker() for ClusterFuture ... done [15:32:00.394] MultisessionFuture: [15:32:00.394] Label: 'future_lapply-1' [15:32:00.394] Expression: [15:32:00.394] { [15:32:00.394] do.call(function(...) { [15:32:00.394] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:00.394] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:32:00.394] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:00.394] on.exit(options(oopts), add = TRUE) [15:32:00.394] } [15:32:00.394] { [15:32:00.394] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:32:00.394] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:00.394] ...future.FUN(...future.X_jj, ...) [15:32:00.394] }) [15:32:00.394] } [15:32:00.394] }, args = future.call.arguments) [15:32:00.394] } [15:32:00.394] Lazy evaluation: FALSE [15:32:00.394] Asynchronous evaluation: TRUE [15:32:00.394] Local evaluation: TRUE [15:32:00.394] Environment: R_GlobalEnv [15:32:00.394] Capture standard output: TRUE [15:32:00.394] Capture condition classes: 'condition' (excluding 'nothing') [15:32:00.394] Globals: 5 objects totaling 17.79 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 12.94 KiB, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:32:00.394] Packages: 1 packages ('listenv') [15:32:00.394] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:32:00.394] Resolved: TRUE [15:32:00.394] Value: [15:32:00.394] Conditions captured: [15:32:00.394] Early signaling: FALSE [15:32:00.394] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:32:00.394] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:32:00.428] Chunk #1 of 2 ... DONE [15:32:00.428] Chunk #2 of 2 ... [15:32:00.428] - Finding globals in 'X' for chunk #2 ... [15:32:00.429] getGlobalsAndPackages() ... [15:32:00.429] Searching for globals... [15:32:00.430] [15:32:00.430] Searching for globals ... DONE [15:32:00.431] - globals: [0] [15:32:00.431] getGlobalsAndPackages() ... DONE [15:32:00.431] + additional globals found: [n=0] [15:32:00.432] + additional namespaces needed: [n=0] [15:32:00.432] - Finding globals in 'X' for chunk #2 ... DONE [15:32:00.432] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:32:00.433] - seeds: [15:32:00.433] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:00.433] getGlobalsAndPackages() ... [15:32:00.434] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:00.434] Resolving globals: FALSE [15:32:00.434] Tweak future expression to call with '...' arguments ... [15:32:00.435] { [15:32:00.435] do.call(function(...) { [15:32:00.435] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:00.435] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:32:00.435] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:00.435] on.exit(options(oopts), add = TRUE) [15:32:00.435] } [15:32:00.435] { [15:32:00.435] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:32:00.435] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:00.435] ...future.FUN(...future.X_jj, ...) [15:32:00.435] }) [15:32:00.435] } [15:32:00.435] }, args = future.call.arguments) [15:32:00.435] } [15:32:00.435] Tweak future expression to call with '...' arguments ... DONE [15:32:00.436] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:00.437] - packages: [1] 'listenv' [15:32:00.437] getGlobalsAndPackages() ... DONE [15:32:00.438] run() for 'Future' ... [15:32:00.438] - state: 'created' [15:32:00.438] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:32:00.457] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:32:00.458] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:32:00.458] - Field: 'node' [15:32:00.458] - Field: 'label' [15:32:00.459] - Field: 'local' [15:32:00.459] - Field: 'owner' [15:32:00.459] - Field: 'envir' [15:32:00.460] - Field: 'workers' [15:32:00.460] - Field: 'packages' [15:32:00.460] - Field: 'gc' [15:32:00.460] - Field: 'conditions' [15:32:00.461] - Field: 'persistent' [15:32:00.461] - Field: 'expr' [15:32:00.461] - Field: 'uuid' [15:32:00.461] - Field: 'seed' [15:32:00.462] - Field: 'version' [15:32:00.462] - Field: 'result' [15:32:00.462] - Field: 'asynchronous' [15:32:00.462] - Field: 'calls' [15:32:00.462] - Field: 'globals' [15:32:00.463] - Field: 'stdout' [15:32:00.463] - Field: 'earlySignal' [15:32:00.463] - Field: 'lazy' [15:32:00.463] - Field: 'state' [15:32:00.463] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:32:00.464] - Launch lazy future ... [15:32:00.464] Packages needed by the future expression (n = 1): 'listenv' [15:32:00.464] Packages needed by future strategies (n = 0): [15:32:00.465] { [15:32:00.465] { [15:32:00.465] { [15:32:00.465] ...future.startTime <- base::Sys.time() [15:32:00.465] { [15:32:00.465] { [15:32:00.465] { [15:32:00.465] { [15:32:00.465] { [15:32:00.465] base::local({ [15:32:00.465] has_future <- base::requireNamespace("future", [15:32:00.465] quietly = TRUE) [15:32:00.465] if (has_future) { [15:32:00.465] ns <- base::getNamespace("future") [15:32:00.465] version <- ns[[".package"]][["version"]] [15:32:00.465] if (is.null(version)) [15:32:00.465] version <- utils::packageVersion("future") [15:32:00.465] } [15:32:00.465] else { [15:32:00.465] version <- NULL [15:32:00.465] } [15:32:00.465] if (!has_future || version < "1.8.0") { [15:32:00.465] info <- base::c(r_version = base::gsub("R version ", [15:32:00.465] "", base::R.version$version.string), [15:32:00.465] platform = base::sprintf("%s (%s-bit)", [15:32:00.465] base::R.version$platform, 8 * [15:32:00.465] base::.Machine$sizeof.pointer), [15:32:00.465] os = base::paste(base::Sys.info()[base::c("sysname", [15:32:00.465] "release", "version")], collapse = " "), [15:32:00.465] hostname = base::Sys.info()[["nodename"]]) [15:32:00.465] info <- base::sprintf("%s: %s", base::names(info), [15:32:00.465] info) [15:32:00.465] info <- base::paste(info, collapse = "; ") [15:32:00.465] if (!has_future) { [15:32:00.465] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:32:00.465] info) [15:32:00.465] } [15:32:00.465] else { [15:32:00.465] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:32:00.465] info, version) [15:32:00.465] } [15:32:00.465] base::stop(msg) [15:32:00.465] } [15:32:00.465] }) [15:32:00.465] } [15:32:00.465] ...future.mc.cores.old <- base::getOption("mc.cores") [15:32:00.465] base::options(mc.cores = 1L) [15:32:00.465] } [15:32:00.465] base::local({ [15:32:00.465] for (pkg in "listenv") { [15:32:00.465] base::loadNamespace(pkg) [15:32:00.465] base::library(pkg, character.only = TRUE) [15:32:00.465] } [15:32:00.465] }) [15:32:00.465] } [15:32:00.465] ...future.strategy.old <- future::plan("list") [15:32:00.465] options(future.plan = NULL) [15:32:00.465] Sys.unsetenv("R_FUTURE_PLAN") [15:32:00.465] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:32:00.465] } [15:32:00.465] ...future.workdir <- getwd() [15:32:00.465] } [15:32:00.465] ...future.oldOptions <- base::as.list(base::.Options) [15:32:00.465] ...future.oldEnvVars <- base::Sys.getenv() [15:32:00.465] } [15:32:00.465] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:32:00.465] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:32:00.465] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:32:00.465] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:32:00.465] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:32:00.465] future.stdout.windows.reencode = NULL, width = 80L) [15:32:00.465] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:32:00.465] base::names(...future.oldOptions)) [15:32:00.465] } [15:32:00.465] if (FALSE) { [15:32:00.465] } [15:32:00.465] else { [15:32:00.465] if (TRUE) { [15:32:00.465] ...future.stdout <- base::rawConnection(base::raw(0L), [15:32:00.465] open = "w") [15:32:00.465] } [15:32:00.465] else { [15:32:00.465] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:32:00.465] windows = "NUL", "/dev/null"), open = "w") [15:32:00.465] } [15:32:00.465] base::sink(...future.stdout, type = "output", split = FALSE) [15:32:00.465] base::on.exit(if (!base::is.null(...future.stdout)) { [15:32:00.465] base::sink(type = "output", split = FALSE) [15:32:00.465] base::close(...future.stdout) [15:32:00.465] }, add = TRUE) [15:32:00.465] } [15:32:00.465] ...future.frame <- base::sys.nframe() [15:32:00.465] ...future.conditions <- base::list() [15:32:00.465] ...future.rng <- base::globalenv()$.Random.seed [15:32:00.465] if (FALSE) { [15:32:00.465] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:32:00.465] "...future.value", "...future.globalenv.names", ".Random.seed") [15:32:00.465] } [15:32:00.465] ...future.result <- base::tryCatch({ [15:32:00.465] base::withCallingHandlers({ [15:32:00.465] ...future.value <- base::withVisible(base::local({ [15:32:00.465] ...future.makeSendCondition <- base::local({ [15:32:00.465] sendCondition <- NULL [15:32:00.465] function(frame = 1L) { [15:32:00.465] if (is.function(sendCondition)) [15:32:00.465] return(sendCondition) [15:32:00.465] ns <- getNamespace("parallel") [15:32:00.465] if (exists("sendData", mode = "function", [15:32:00.465] envir = ns)) { [15:32:00.465] parallel_sendData <- get("sendData", mode = "function", [15:32:00.465] envir = ns) [15:32:00.465] envir <- sys.frame(frame) [15:32:00.465] master <- NULL [15:32:00.465] while (!identical(envir, .GlobalEnv) && [15:32:00.465] !identical(envir, emptyenv())) { [15:32:00.465] if (exists("master", mode = "list", envir = envir, [15:32:00.465] inherits = FALSE)) { [15:32:00.465] master <- get("master", mode = "list", [15:32:00.465] envir = envir, inherits = FALSE) [15:32:00.465] if (inherits(master, c("SOCKnode", [15:32:00.465] "SOCK0node"))) { [15:32:00.465] sendCondition <<- function(cond) { [15:32:00.465] data <- list(type = "VALUE", value = cond, [15:32:00.465] success = TRUE) [15:32:00.465] parallel_sendData(master, data) [15:32:00.465] } [15:32:00.465] return(sendCondition) [15:32:00.465] } [15:32:00.465] } [15:32:00.465] frame <- frame + 1L [15:32:00.465] envir <- sys.frame(frame) [15:32:00.465] } [15:32:00.465] } [15:32:00.465] sendCondition <<- function(cond) NULL [15:32:00.465] } [15:32:00.465] }) [15:32:00.465] withCallingHandlers({ [15:32:00.465] { [15:32:00.465] do.call(function(...) { [15:32:00.465] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:00.465] if (!identical(...future.globals.maxSize.org, [15:32:00.465] ...future.globals.maxSize)) { [15:32:00.465] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:00.465] on.exit(options(oopts), add = TRUE) [15:32:00.465] } [15:32:00.465] { [15:32:00.465] lapply(seq_along(...future.elements_ii), [15:32:00.465] FUN = function(jj) { [15:32:00.465] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:00.465] ...future.FUN(...future.X_jj, ...) [15:32:00.465] }) [15:32:00.465] } [15:32:00.465] }, args = future.call.arguments) [15:32:00.465] } [15:32:00.465] }, immediateCondition = function(cond) { [15:32:00.465] sendCondition <- ...future.makeSendCondition() [15:32:00.465] sendCondition(cond) [15:32:00.465] muffleCondition <- function (cond, pattern = "^muffle") [15:32:00.465] { [15:32:00.465] inherits <- base::inherits [15:32:00.465] invokeRestart <- base::invokeRestart [15:32:00.465] is.null <- base::is.null [15:32:00.465] muffled <- FALSE [15:32:00.465] if (inherits(cond, "message")) { [15:32:00.465] muffled <- grepl(pattern, "muffleMessage") [15:32:00.465] if (muffled) [15:32:00.465] invokeRestart("muffleMessage") [15:32:00.465] } [15:32:00.465] else if (inherits(cond, "warning")) { [15:32:00.465] muffled <- grepl(pattern, "muffleWarning") [15:32:00.465] if (muffled) [15:32:00.465] invokeRestart("muffleWarning") [15:32:00.465] } [15:32:00.465] else if (inherits(cond, "condition")) { [15:32:00.465] if (!is.null(pattern)) { [15:32:00.465] computeRestarts <- base::computeRestarts [15:32:00.465] grepl <- base::grepl [15:32:00.465] restarts <- computeRestarts(cond) [15:32:00.465] for (restart in restarts) { [15:32:00.465] name <- restart$name [15:32:00.465] if (is.null(name)) [15:32:00.465] next [15:32:00.465] if (!grepl(pattern, name)) [15:32:00.465] next [15:32:00.465] invokeRestart(restart) [15:32:00.465] muffled <- TRUE [15:32:00.465] break [15:32:00.465] } [15:32:00.465] } [15:32:00.465] } [15:32:00.465] invisible(muffled) [15:32:00.465] } [15:32:00.465] muffleCondition(cond) [15:32:00.465] }) [15:32:00.465] })) [15:32:00.465] future::FutureResult(value = ...future.value$value, [15:32:00.465] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:32:00.465] ...future.rng), globalenv = if (FALSE) [15:32:00.465] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:32:00.465] ...future.globalenv.names)) [15:32:00.465] else NULL, started = ...future.startTime, version = "1.8") [15:32:00.465] }, condition = base::local({ [15:32:00.465] c <- base::c [15:32:00.465] inherits <- base::inherits [15:32:00.465] invokeRestart <- base::invokeRestart [15:32:00.465] length <- base::length [15:32:00.465] list <- base::list [15:32:00.465] seq.int <- base::seq.int [15:32:00.465] signalCondition <- base::signalCondition [15:32:00.465] sys.calls <- base::sys.calls [15:32:00.465] `[[` <- base::`[[` [15:32:00.465] `+` <- base::`+` [15:32:00.465] `<<-` <- base::`<<-` [15:32:00.465] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:32:00.465] calls[seq.int(from = from + 12L, to = length(calls) - [15:32:00.465] 3L)] [15:32:00.465] } [15:32:00.465] function(cond) { [15:32:00.465] is_error <- inherits(cond, "error") [15:32:00.465] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:32:00.465] NULL) [15:32:00.465] if (is_error) { [15:32:00.465] sessionInformation <- function() { [15:32:00.465] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:32:00.465] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:32:00.465] search = base::search(), system = base::Sys.info()) [15:32:00.465] } [15:32:00.465] ...future.conditions[[length(...future.conditions) + [15:32:00.465] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:32:00.465] cond$call), session = sessionInformation(), [15:32:00.465] timestamp = base::Sys.time(), signaled = 0L) [15:32:00.465] signalCondition(cond) [15:32:00.465] } [15:32:00.465] else if (!ignore && TRUE && inherits(cond, c("condition", [15:32:00.465] "immediateCondition"))) { [15:32:00.465] signal <- TRUE && inherits(cond, "immediateCondition") [15:32:00.465] ...future.conditions[[length(...future.conditions) + [15:32:00.465] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:32:00.465] if (TRUE && !signal) { [15:32:00.465] muffleCondition <- function (cond, pattern = "^muffle") [15:32:00.465] { [15:32:00.465] inherits <- base::inherits [15:32:00.465] invokeRestart <- base::invokeRestart [15:32:00.465] is.null <- base::is.null [15:32:00.465] muffled <- FALSE [15:32:00.465] if (inherits(cond, "message")) { [15:32:00.465] muffled <- grepl(pattern, "muffleMessage") [15:32:00.465] if (muffled) [15:32:00.465] invokeRestart("muffleMessage") [15:32:00.465] } [15:32:00.465] else if (inherits(cond, "warning")) { [15:32:00.465] muffled <- grepl(pattern, "muffleWarning") [15:32:00.465] if (muffled) [15:32:00.465] invokeRestart("muffleWarning") [15:32:00.465] } [15:32:00.465] else if (inherits(cond, "condition")) { [15:32:00.465] if (!is.null(pattern)) { [15:32:00.465] computeRestarts <- base::computeRestarts [15:32:00.465] grepl <- base::grepl [15:32:00.465] restarts <- computeRestarts(cond) [15:32:00.465] for (restart in restarts) { [15:32:00.465] name <- restart$name [15:32:00.465] if (is.null(name)) [15:32:00.465] next [15:32:00.465] if (!grepl(pattern, name)) [15:32:00.465] next [15:32:00.465] invokeRestart(restart) [15:32:00.465] muffled <- TRUE [15:32:00.465] break [15:32:00.465] } [15:32:00.465] } [15:32:00.465] } [15:32:00.465] invisible(muffled) [15:32:00.465] } [15:32:00.465] muffleCondition(cond, pattern = "^muffle") [15:32:00.465] } [15:32:00.465] } [15:32:00.465] else { [15:32:00.465] if (TRUE) { [15:32:00.465] muffleCondition <- function (cond, pattern = "^muffle") [15:32:00.465] { [15:32:00.465] inherits <- base::inherits [15:32:00.465] invokeRestart <- base::invokeRestart [15:32:00.465] is.null <- base::is.null [15:32:00.465] muffled <- FALSE [15:32:00.465] if (inherits(cond, "message")) { [15:32:00.465] muffled <- grepl(pattern, "muffleMessage") [15:32:00.465] if (muffled) [15:32:00.465] invokeRestart("muffleMessage") [15:32:00.465] } [15:32:00.465] else if (inherits(cond, "warning")) { [15:32:00.465] muffled <- grepl(pattern, "muffleWarning") [15:32:00.465] if (muffled) [15:32:00.465] invokeRestart("muffleWarning") [15:32:00.465] } [15:32:00.465] else if (inherits(cond, "condition")) { [15:32:00.465] if (!is.null(pattern)) { [15:32:00.465] computeRestarts <- base::computeRestarts [15:32:00.465] grepl <- base::grepl [15:32:00.465] restarts <- computeRestarts(cond) [15:32:00.465] for (restart in restarts) { [15:32:00.465] name <- restart$name [15:32:00.465] if (is.null(name)) [15:32:00.465] next [15:32:00.465] if (!grepl(pattern, name)) [15:32:00.465] next [15:32:00.465] invokeRestart(restart) [15:32:00.465] muffled <- TRUE [15:32:00.465] break [15:32:00.465] } [15:32:00.465] } [15:32:00.465] } [15:32:00.465] invisible(muffled) [15:32:00.465] } [15:32:00.465] muffleCondition(cond, pattern = "^muffle") [15:32:00.465] } [15:32:00.465] } [15:32:00.465] } [15:32:00.465] })) [15:32:00.465] }, error = function(ex) { [15:32:00.465] base::structure(base::list(value = NULL, visible = NULL, [15:32:00.465] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:32:00.465] ...future.rng), started = ...future.startTime, [15:32:00.465] finished = Sys.time(), session_uuid = NA_character_, [15:32:00.465] version = "1.8"), class = "FutureResult") [15:32:00.465] }, finally = { [15:32:00.465] if (!identical(...future.workdir, getwd())) [15:32:00.465] setwd(...future.workdir) [15:32:00.465] { [15:32:00.465] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:32:00.465] ...future.oldOptions$nwarnings <- NULL [15:32:00.465] } [15:32:00.465] base::options(...future.oldOptions) [15:32:00.465] if (.Platform$OS.type == "windows") { [15:32:00.465] old_names <- names(...future.oldEnvVars) [15:32:00.465] envs <- base::Sys.getenv() [15:32:00.465] names <- names(envs) [15:32:00.465] common <- intersect(names, old_names) [15:32:00.465] added <- setdiff(names, old_names) [15:32:00.465] removed <- setdiff(old_names, names) [15:32:00.465] changed <- common[...future.oldEnvVars[common] != [15:32:00.465] envs[common]] [15:32:00.465] NAMES <- toupper(changed) [15:32:00.465] args <- list() [15:32:00.465] for (kk in seq_along(NAMES)) { [15:32:00.465] name <- changed[[kk]] [15:32:00.465] NAME <- NAMES[[kk]] [15:32:00.465] if (name != NAME && is.element(NAME, old_names)) [15:32:00.465] next [15:32:00.465] args[[name]] <- ...future.oldEnvVars[[name]] [15:32:00.465] } [15:32:00.465] NAMES <- toupper(added) [15:32:00.465] for (kk in seq_along(NAMES)) { [15:32:00.465] name <- added[[kk]] [15:32:00.465] NAME <- NAMES[[kk]] [15:32:00.465] if (name != NAME && is.element(NAME, old_names)) [15:32:00.465] next [15:32:00.465] args[[name]] <- "" [15:32:00.465] } [15:32:00.465] NAMES <- toupper(removed) [15:32:00.465] for (kk in seq_along(NAMES)) { [15:32:00.465] name <- removed[[kk]] [15:32:00.465] NAME <- NAMES[[kk]] [15:32:00.465] if (name != NAME && is.element(NAME, old_names)) [15:32:00.465] next [15:32:00.465] args[[name]] <- ...future.oldEnvVars[[name]] [15:32:00.465] } [15:32:00.465] if (length(args) > 0) [15:32:00.465] base::do.call(base::Sys.setenv, args = args) [15:32:00.465] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:32:00.465] } [15:32:00.465] else { [15:32:00.465] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:32:00.465] } [15:32:00.465] { [15:32:00.465] if (base::length(...future.futureOptionsAdded) > [15:32:00.465] 0L) { [15:32:00.465] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:32:00.465] base::names(opts) <- ...future.futureOptionsAdded [15:32:00.465] base::options(opts) [15:32:00.465] } [15:32:00.465] { [15:32:00.465] { [15:32:00.465] base::options(mc.cores = ...future.mc.cores.old) [15:32:00.465] NULL [15:32:00.465] } [15:32:00.465] options(future.plan = NULL) [15:32:00.465] if (is.na(NA_character_)) [15:32:00.465] Sys.unsetenv("R_FUTURE_PLAN") [15:32:00.465] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:32:00.465] future::plan(...future.strategy.old, .cleanup = FALSE, [15:32:00.465] .init = FALSE) [15:32:00.465] } [15:32:00.465] } [15:32:00.465] } [15:32:00.465] }) [15:32:00.465] if (TRUE) { [15:32:00.465] base::sink(type = "output", split = FALSE) [15:32:00.465] if (TRUE) { [15:32:00.465] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:32:00.465] } [15:32:00.465] else { [15:32:00.465] ...future.result["stdout"] <- base::list(NULL) [15:32:00.465] } [15:32:00.465] base::close(...future.stdout) [15:32:00.465] ...future.stdout <- NULL [15:32:00.465] } [15:32:00.465] ...future.result$conditions <- ...future.conditions [15:32:00.465] ...future.result$finished <- base::Sys.time() [15:32:00.465] ...future.result [15:32:00.465] } [15:32:00.475] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... [15:32:00.476] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... [15:32:00.477] Exporting '...future.FUN' (4.85 KiB) to cluster node #1 ... DONE [15:32:00.478] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [15:32:00.478] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [15:32:00.479] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [15:32:00.480] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [15:32:00.480] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:32:00.481] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:32:00.481] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:32:00.482] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:32:00.482] Exporting 5 global objects (4.85 KiB) to cluster node #1 ... DONE [15:32:00.484] MultisessionFuture started [15:32:00.484] - Launch lazy future ... done [15:32:00.484] run() for 'MultisessionFuture' ... done [15:32:00.485] Created future: [15:32:00.512] receiveMessageFromWorker() for ClusterFuture ... [15:32:00.512] - Validating connection of MultisessionFuture [15:32:00.513] - received message: FutureResult [15:32:00.513] - Received FutureResult [15:32:00.514] - Erased future from FutureRegistry [15:32:00.514] result() for ClusterFuture ... [15:32:00.514] - result already collected: FutureResult [15:32:00.515] result() for ClusterFuture ... done [15:32:00.515] receiveMessageFromWorker() for ClusterFuture ... done [15:32:00.485] MultisessionFuture: [15:32:00.485] Label: 'future_lapply-2' [15:32:00.485] Expression: [15:32:00.485] { [15:32:00.485] do.call(function(...) { [15:32:00.485] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:00.485] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:32:00.485] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:00.485] on.exit(options(oopts), add = TRUE) [15:32:00.485] } [15:32:00.485] { [15:32:00.485] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:32:00.485] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:00.485] ...future.FUN(...future.X_jj, ...) [15:32:00.485] }) [15:32:00.485] } [15:32:00.485] }, args = future.call.arguments) [15:32:00.485] } [15:32:00.485] Lazy evaluation: FALSE [15:32:00.485] Asynchronous evaluation: TRUE [15:32:00.485] Local evaluation: TRUE [15:32:00.485] Environment: R_GlobalEnv [15:32:00.485] Capture standard output: TRUE [15:32:00.485] Capture condition classes: 'condition' (excluding 'nothing') [15:32:00.485] Globals: 5 objects totaling 4.96 KiB (function '...future.FUN' of 4.85 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:32:00.485] Packages: 1 packages ('listenv') [15:32:00.485] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:32:00.485] Resolved: TRUE [15:32:00.485] Value: [15:32:00.485] Conditions captured: [15:32:00.485] Early signaling: FALSE [15:32:00.485] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:32:00.485] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:32:00.516] Chunk #2 of 2 ... DONE [15:32:00.516] Launching 2 futures (chunks) ... DONE [15:32:00.516] Resolving 2 futures (chunks) ... [15:32:00.517] resolve() on list ... [15:32:00.517] recursive: 0 [15:32:00.518] length: 2 [15:32:00.518] [15:32:00.518] Future #1 [15:32:00.519] result() for ClusterFuture ... [15:32:00.519] - result already collected: FutureResult [15:32:00.519] result() for ClusterFuture ... done [15:32:00.520] result() for ClusterFuture ... [15:32:00.520] - result already collected: FutureResult [15:32:00.520] result() for ClusterFuture ... done [15:32:00.521] signalConditionsASAP(MultisessionFuture, pos=1) ... [15:32:00.521] - nx: 2 [15:32:00.521] - relay: TRUE [15:32:00.522] - stdout: TRUE [15:32:00.522] - signal: TRUE [15:32:00.522] - resignal: FALSE [15:32:00.522] - force: TRUE [15:32:00.523] - relayed: [n=2] FALSE, FALSE [15:32:00.523] - queued futures: [n=2] FALSE, FALSE [15:32:00.523] - until=1 [15:32:00.524] - relaying element #1 [15:32:00.524] result() for ClusterFuture ... [15:32:00.524] - result already collected: FutureResult [15:32:00.525] result() for ClusterFuture ... done [15:32:00.525] result() for ClusterFuture ... [15:32:00.525] - result already collected: FutureResult [15:32:00.525] result() for ClusterFuture ... done [15:32:00.526] result() for ClusterFuture ... [15:32:00.526] - result already collected: FutureResult [15:32:00.526] result() for ClusterFuture ... done [15:32:00.527] result() for ClusterFuture ... [15:32:00.527] - result already collected: FutureResult [15:32:00.527] result() for ClusterFuture ... done [15:32:00.528] - relayed: [n=2] TRUE, FALSE [15:32:00.528] - queued futures: [n=2] TRUE, FALSE [15:32:00.528] signalConditionsASAP(MultisessionFuture, pos=1) ... done [15:32:00.529] length: 1 (resolved future 1) [15:32:00.529] Future #2 [15:32:00.529] result() for ClusterFuture ... [15:32:00.530] - result already collected: FutureResult [15:32:00.530] result() for ClusterFuture ... done [15:32:00.530] result() for ClusterFuture ... [15:32:00.531] - result already collected: FutureResult [15:32:00.531] result() for ClusterFuture ... done [15:32:00.531] signalConditionsASAP(MultisessionFuture, pos=2) ... [15:32:00.532] - nx: 2 [15:32:00.532] - relay: TRUE [15:32:00.532] - stdout: TRUE [15:32:00.532] - signal: TRUE [15:32:00.533] - resignal: FALSE [15:32:00.533] - force: TRUE [15:32:00.533] - relayed: [n=2] TRUE, FALSE [15:32:00.534] - queued futures: [n=2] TRUE, FALSE [15:32:00.534] - until=2 [15:32:00.534] - relaying element #2 [15:32:00.535] result() for ClusterFuture ... [15:32:00.535] - result already collected: FutureResult [15:32:00.535] result() for ClusterFuture ... done [15:32:00.536] result() for ClusterFuture ... [15:32:00.536] - result already collected: FutureResult [15:32:00.536] result() for ClusterFuture ... done [15:32:00.537] result() for ClusterFuture ... [15:32:00.537] - result already collected: FutureResult [15:32:00.537] result() for ClusterFuture ... done [15:32:00.538] result() for ClusterFuture ... [15:32:00.538] - result already collected: FutureResult [15:32:00.538] result() for ClusterFuture ... done [15:32:00.538] - relayed: [n=2] TRUE, TRUE [15:32:00.539] - queued futures: [n=2] TRUE, TRUE [15:32:00.539] signalConditionsASAP(MultisessionFuture, pos=2) ... done [15:32:00.539] length: 0 (resolved future 2) [15:32:00.540] Relaying remaining futures [15:32:00.540] signalConditionsASAP(NULL, pos=0) ... [15:32:00.540] - nx: 2 [15:32:00.541] - relay: TRUE [15:32:00.541] - stdout: TRUE [15:32:00.541] - signal: TRUE [15:32:00.542] - resignal: FALSE [15:32:00.542] - force: TRUE [15:32:00.542] - relayed: [n=2] TRUE, TRUE [15:32:00.542] - queued futures: [n=2] TRUE, TRUE - flush all [15:32:00.543] - relayed: [n=2] TRUE, TRUE [15:32:00.543] - queued futures: [n=2] TRUE, TRUE [15:32:00.544] signalConditionsASAP(NULL, pos=0) ... done [15:32:00.544] resolve() on list ... DONE [15:32:00.544] result() for ClusterFuture ... [15:32:00.545] - result already collected: FutureResult [15:32:00.545] result() for ClusterFuture ... done [15:32:00.545] result() for ClusterFuture ... [15:32:00.545] - result already collected: FutureResult [15:32:00.546] result() for ClusterFuture ... done [15:32:00.546] result() for ClusterFuture ... [15:32:00.547] - result already collected: FutureResult [15:32:00.547] result() for ClusterFuture ... done [15:32:00.547] result() for ClusterFuture ... [15:32:00.547] - result already collected: FutureResult [15:32:00.548] result() for ClusterFuture ... done [15:32:00.548] - Number of value chunks collected: 2 [15:32:00.548] Resolving 2 futures (chunks) ... DONE [15:32:00.549] Reducing values from 2 chunks ... [15:32:00.549] - Number of values collected after concatenation: 2 [15:32:00.549] - Number of values expected: 2 [15:32:00.550] Reverse index remapping (attribute 'ordering'): [n = 2] 2, 1 [15:32:00.550] Reducing values from 2 chunks ... DONE [15:32:00.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, ...) for large length(x) ... [15:32:00.554] future_lapply() ... [15:32:00.571] Number of chunks: 2 [15:32:00.572] getGlobalsAndPackagesXApply() ... [15:32:00.572] - future.globals: TRUE [15:32:00.572] getGlobalsAndPackages() ... [15:32:00.573] Searching for globals... [15:32:00.575] - globals found: [4] 'FUN', 'sqrt', '+', 'a' [15:32:00.576] Searching for globals ... DONE [15:32:00.576] Resolving globals: FALSE [15:32:00.577] The total size of the 2 globals is 1.93 KiB (1976 bytes) [15:32:00.578] The total size of the 2 globals exported for future expression ('FUN()') is 1.93 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are two globals: 'FUN' (1.88 KiB of class 'function') and 'a' (56 bytes of class 'numeric') [15:32:00.578] - globals: [2] 'FUN', 'a' [15:32:00.578] [15:32:00.579] getGlobalsAndPackages() ... DONE [15:32:00.579] - globals found/used: [n=2] 'FUN', 'a' [15:32:00.579] - needed namespaces: [n=0] [15:32:00.580] Finding globals ... DONE [15:32:00.580] - use_args: TRUE [15:32:00.580] - Getting '...' globals ... [15:32:00.581] resolve() on list ... [15:32:00.581] recursive: 0 [15:32:00.582] length: 1 [15:32:00.582] elements: '...' [15:32:00.582] length: 0 (resolved future 1) [15:32:00.583] resolve() on list ... DONE [15:32:00.583] - '...' content: [n=0] [15:32:00.583] List of 1 [15:32:00.583] $ ...: list() [15:32:00.583] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:32:00.583] - attr(*, "where")=List of 1 [15:32:00.583] ..$ ...: [15:32:00.583] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:32:00.583] - attr(*, "resolved")= logi TRUE [15:32:00.583] - attr(*, "total_size")= num NA [15:32:00.589] - Getting '...' globals ... DONE [15:32:00.589] Globals to be used in all futures (chunks): [n=3] '...future.FUN', 'a', '...' [15:32:00.590] List of 3 [15:32:00.590] $ ...future.FUN:function (z) [15:32:00.590] $ a : num 3.14 [15:32:00.590] $ ... : list() [15:32:00.590] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:32:00.590] - attr(*, "where")=List of 3 [15:32:00.590] ..$ ...future.FUN: [15:32:00.590] ..$ a : [15:32:00.590] ..$ ... : [15:32:00.590] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:32:00.590] - attr(*, "resolved")= logi FALSE [15:32:00.590] - attr(*, "total_size")= num 1976 [15:32:00.597] Packages to be attached in all futures: [n=0] [15:32:00.597] getGlobalsAndPackagesXApply() ... DONE [15:32:00.598] Number of futures (= number of chunks): 2 [15:32:00.598] Launching 2 futures (chunks) ... [15:32:00.598] Chunk #1 of 2 ... [15:32:00.600] - Finding globals in 'X' for chunk #1 ... [15:32:00.600] getGlobalsAndPackages() ... [15:32:00.601] Searching for globals... [15:32:00.608] [15:32:00.609] Searching for globals ... DONE [15:32:00.609] - globals: [0] [15:32:00.609] getGlobalsAndPackages() ... DONE [15:32:00.610] + additional globals found: [n=0] [15:32:00.610] + additional namespaces needed: [n=0] [15:32:00.610] - Finding globals in 'X' for chunk #1 ... DONE [15:32:00.611] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:32:00.611] - seeds: [15:32:00.611] - All globals exported: [n=6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:00.612] getGlobalsAndPackages() ... [15:32:00.612] - globals passed as-is: [6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:00.613] Resolving globals: FALSE [15:32:00.613] Tweak future expression to call with '...' arguments ... [15:32:00.613] { [15:32:00.613] do.call(function(...) { [15:32:00.613] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:00.613] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:32:00.613] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:00.613] on.exit(options(oopts), add = TRUE) [15:32:00.613] } [15:32:00.613] { [15:32:00.613] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:32:00.613] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:00.613] ...future.FUN(...future.X_jj, ...) [15:32:00.613] }) [15:32:00.613] } [15:32:00.613] }, args = future.call.arguments) [15:32:00.613] } [15:32:00.614] Tweak future expression to call with '...' arguments ... DONE [15:32:00.615] - globals: [6] '...future.FUN', 'a', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:00.616] [15:32:00.616] getGlobalsAndPackages() ... DONE [15:32:00.617] run() for 'Future' ... [15:32:00.617] - state: 'created' [15:32:00.618] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:32:00.641] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:32:00.641] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:32:00.642] - Field: 'node' [15:32:00.642] - Field: 'label' [15:32:00.642] - Field: 'local' [15:32:00.643] - Field: 'owner' [15:32:00.643] - Field: 'envir' [15:32:00.643] - Field: 'workers' [15:32:00.644] - Field: 'packages' [15:32:00.644] - Field: 'gc' [15:32:00.645] - Field: 'conditions' [15:32:00.645] - Field: 'persistent' [15:32:00.645] - Field: 'expr' [15:32:00.646] - Field: 'uuid' [15:32:00.646] - Field: 'seed' [15:32:00.646] - Field: 'version' [15:32:00.647] - Field: 'result' [15:32:00.647] - Field: 'asynchronous' [15:32:00.647] - Field: 'calls' [15:32:00.648] - Field: 'globals' [15:32:00.648] - Field: 'stdout' [15:32:00.649] - Field: 'earlySignal' [15:32:00.649] - Field: 'lazy' [15:32:00.649] - Field: 'state' [15:32:00.650] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:32:00.650] - Launch lazy future ... [15:32:00.651] Packages needed by the future expression (n = 0): [15:32:00.651] Packages needed by future strategies (n = 0): [15:32:00.652] { [15:32:00.652] { [15:32:00.652] { [15:32:00.652] ...future.startTime <- base::Sys.time() [15:32:00.652] { [15:32:00.652] { [15:32:00.652] { [15:32:00.652] { [15:32:00.652] base::local({ [15:32:00.652] has_future <- base::requireNamespace("future", [15:32:00.652] quietly = TRUE) [15:32:00.652] if (has_future) { [15:32:00.652] ns <- base::getNamespace("future") [15:32:00.652] version <- ns[[".package"]][["version"]] [15:32:00.652] if (is.null(version)) [15:32:00.652] version <- utils::packageVersion("future") [15:32:00.652] } [15:32:00.652] else { [15:32:00.652] version <- NULL [15:32:00.652] } [15:32:00.652] if (!has_future || version < "1.8.0") { [15:32:00.652] info <- base::c(r_version = base::gsub("R version ", [15:32:00.652] "", base::R.version$version.string), [15:32:00.652] platform = base::sprintf("%s (%s-bit)", [15:32:00.652] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:32:00.652] os = base::paste(base::Sys.info()[base::c("sysname", [15:32:00.652] "release", "version")], collapse = " "), [15:32:00.652] hostname = base::Sys.info()[["nodename"]]) [15:32:00.652] info <- base::sprintf("%s: %s", base::names(info), [15:32:00.652] info) [15:32:00.652] info <- base::paste(info, collapse = "; ") [15:32:00.652] if (!has_future) { [15:32:00.652] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:32:00.652] info) [15:32:00.652] } [15:32:00.652] else { [15:32:00.652] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:32:00.652] info, version) [15:32:00.652] } [15:32:00.652] base::stop(msg) [15:32:00.652] } [15:32:00.652] }) [15:32:00.652] } [15:32:00.652] ...future.mc.cores.old <- base::getOption("mc.cores") [15:32:00.652] base::options(mc.cores = 1L) [15:32:00.652] } [15:32:00.652] ...future.strategy.old <- future::plan("list") [15:32:00.652] options(future.plan = NULL) [15:32:00.652] Sys.unsetenv("R_FUTURE_PLAN") [15:32:00.652] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:32:00.652] } [15:32:00.652] ...future.workdir <- getwd() [15:32:00.652] } [15:32:00.652] ...future.oldOptions <- base::as.list(base::.Options) [15:32:00.652] ...future.oldEnvVars <- base::Sys.getenv() [15:32:00.652] } [15:32:00.652] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:32:00.652] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:32:00.652] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:32:00.652] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:32:00.652] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:32:00.652] future.stdout.windows.reencode = NULL, width = 80L) [15:32:00.652] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:32:00.652] base::names(...future.oldOptions)) [15:32:00.652] } [15:32:00.652] if (FALSE) { [15:32:00.652] } [15:32:00.652] else { [15:32:00.652] if (TRUE) { [15:32:00.652] ...future.stdout <- base::rawConnection(base::raw(0L), [15:32:00.652] open = "w") [15:32:00.652] } [15:32:00.652] else { [15:32:00.652] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:32:00.652] windows = "NUL", "/dev/null"), open = "w") [15:32:00.652] } [15:32:00.652] base::sink(...future.stdout, type = "output", split = FALSE) [15:32:00.652] base::on.exit(if (!base::is.null(...future.stdout)) { [15:32:00.652] base::sink(type = "output", split = FALSE) [15:32:00.652] base::close(...future.stdout) [15:32:00.652] }, add = TRUE) [15:32:00.652] } [15:32:00.652] ...future.frame <- base::sys.nframe() [15:32:00.652] ...future.conditions <- base::list() [15:32:00.652] ...future.rng <- base::globalenv()$.Random.seed [15:32:00.652] if (FALSE) { [15:32:00.652] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:32:00.652] "...future.value", "...future.globalenv.names", ".Random.seed") [15:32:00.652] } [15:32:00.652] ...future.result <- base::tryCatch({ [15:32:00.652] base::withCallingHandlers({ [15:32:00.652] ...future.value <- base::withVisible(base::local({ [15:32:00.652] ...future.makeSendCondition <- base::local({ [15:32:00.652] sendCondition <- NULL [15:32:00.652] function(frame = 1L) { [15:32:00.652] if (is.function(sendCondition)) [15:32:00.652] return(sendCondition) [15:32:00.652] ns <- getNamespace("parallel") [15:32:00.652] if (exists("sendData", mode = "function", [15:32:00.652] envir = ns)) { [15:32:00.652] parallel_sendData <- get("sendData", mode = "function", [15:32:00.652] envir = ns) [15:32:00.652] envir <- sys.frame(frame) [15:32:00.652] master <- NULL [15:32:00.652] while (!identical(envir, .GlobalEnv) && [15:32:00.652] !identical(envir, emptyenv())) { [15:32:00.652] if (exists("master", mode = "list", envir = envir, [15:32:00.652] inherits = FALSE)) { [15:32:00.652] master <- get("master", mode = "list", [15:32:00.652] envir = envir, inherits = FALSE) [15:32:00.652] if (inherits(master, c("SOCKnode", [15:32:00.652] "SOCK0node"))) { [15:32:00.652] sendCondition <<- function(cond) { [15:32:00.652] data <- list(type = "VALUE", value = cond, [15:32:00.652] success = TRUE) [15:32:00.652] parallel_sendData(master, data) [15:32:00.652] } [15:32:00.652] return(sendCondition) [15:32:00.652] } [15:32:00.652] } [15:32:00.652] frame <- frame + 1L [15:32:00.652] envir <- sys.frame(frame) [15:32:00.652] } [15:32:00.652] } [15:32:00.652] sendCondition <<- function(cond) NULL [15:32:00.652] } [15:32:00.652] }) [15:32:00.652] withCallingHandlers({ [15:32:00.652] { [15:32:00.652] do.call(function(...) { [15:32:00.652] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:00.652] if (!identical(...future.globals.maxSize.org, [15:32:00.652] ...future.globals.maxSize)) { [15:32:00.652] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:00.652] on.exit(options(oopts), add = TRUE) [15:32:00.652] } [15:32:00.652] { [15:32:00.652] lapply(seq_along(...future.elements_ii), [15:32:00.652] FUN = function(jj) { [15:32:00.652] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:00.652] ...future.FUN(...future.X_jj, ...) [15:32:00.652] }) [15:32:00.652] } [15:32:00.652] }, args = future.call.arguments) [15:32:00.652] } [15:32:00.652] }, immediateCondition = function(cond) { [15:32:00.652] sendCondition <- ...future.makeSendCondition() [15:32:00.652] sendCondition(cond) [15:32:00.652] muffleCondition <- function (cond, pattern = "^muffle") [15:32:00.652] { [15:32:00.652] inherits <- base::inherits [15:32:00.652] invokeRestart <- base::invokeRestart [15:32:00.652] is.null <- base::is.null [15:32:00.652] muffled <- FALSE [15:32:00.652] if (inherits(cond, "message")) { [15:32:00.652] muffled <- grepl(pattern, "muffleMessage") [15:32:00.652] if (muffled) [15:32:00.652] invokeRestart("muffleMessage") [15:32:00.652] } [15:32:00.652] else if (inherits(cond, "warning")) { [15:32:00.652] muffled <- grepl(pattern, "muffleWarning") [15:32:00.652] if (muffled) [15:32:00.652] invokeRestart("muffleWarning") [15:32:00.652] } [15:32:00.652] else if (inherits(cond, "condition")) { [15:32:00.652] if (!is.null(pattern)) { [15:32:00.652] computeRestarts <- base::computeRestarts [15:32:00.652] grepl <- base::grepl [15:32:00.652] restarts <- computeRestarts(cond) [15:32:00.652] for (restart in restarts) { [15:32:00.652] name <- restart$name [15:32:00.652] if (is.null(name)) [15:32:00.652] next [15:32:00.652] if (!grepl(pattern, name)) [15:32:00.652] next [15:32:00.652] invokeRestart(restart) [15:32:00.652] muffled <- TRUE [15:32:00.652] break [15:32:00.652] } [15:32:00.652] } [15:32:00.652] } [15:32:00.652] invisible(muffled) [15:32:00.652] } [15:32:00.652] muffleCondition(cond) [15:32:00.652] }) [15:32:00.652] })) [15:32:00.652] future::FutureResult(value = ...future.value$value, [15:32:00.652] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:32:00.652] ...future.rng), globalenv = if (FALSE) [15:32:00.652] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:32:00.652] ...future.globalenv.names)) [15:32:00.652] else NULL, started = ...future.startTime, version = "1.8") [15:32:00.652] }, condition = base::local({ [15:32:00.652] c <- base::c [15:32:00.652] inherits <- base::inherits [15:32:00.652] invokeRestart <- base::invokeRestart [15:32:00.652] length <- base::length [15:32:00.652] list <- base::list [15:32:00.652] seq.int <- base::seq.int [15:32:00.652] signalCondition <- base::signalCondition [15:32:00.652] sys.calls <- base::sys.calls [15:32:00.652] `[[` <- base::`[[` [15:32:00.652] `+` <- base::`+` [15:32:00.652] `<<-` <- base::`<<-` [15:32:00.652] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:32:00.652] calls[seq.int(from = from + 12L, to = length(calls) - [15:32:00.652] 3L)] [15:32:00.652] } [15:32:00.652] function(cond) { [15:32:00.652] is_error <- inherits(cond, "error") [15:32:00.652] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:32:00.652] NULL) [15:32:00.652] if (is_error) { [15:32:00.652] sessionInformation <- function() { [15:32:00.652] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:32:00.652] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:32:00.652] search = base::search(), system = base::Sys.info()) [15:32:00.652] } [15:32:00.652] ...future.conditions[[length(...future.conditions) + [15:32:00.652] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:32:00.652] cond$call), session = sessionInformation(), [15:32:00.652] timestamp = base::Sys.time(), signaled = 0L) [15:32:00.652] signalCondition(cond) [15:32:00.652] } [15:32:00.652] else if (!ignore && TRUE && inherits(cond, c("condition", [15:32:00.652] "immediateCondition"))) { [15:32:00.652] signal <- TRUE && inherits(cond, "immediateCondition") [15:32:00.652] ...future.conditions[[length(...future.conditions) + [15:32:00.652] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:32:00.652] if (TRUE && !signal) { [15:32:00.652] muffleCondition <- function (cond, pattern = "^muffle") [15:32:00.652] { [15:32:00.652] inherits <- base::inherits [15:32:00.652] invokeRestart <- base::invokeRestart [15:32:00.652] is.null <- base::is.null [15:32:00.652] muffled <- FALSE [15:32:00.652] if (inherits(cond, "message")) { [15:32:00.652] muffled <- grepl(pattern, "muffleMessage") [15:32:00.652] if (muffled) [15:32:00.652] invokeRestart("muffleMessage") [15:32:00.652] } [15:32:00.652] else if (inherits(cond, "warning")) { [15:32:00.652] muffled <- grepl(pattern, "muffleWarning") [15:32:00.652] if (muffled) [15:32:00.652] invokeRestart("muffleWarning") [15:32:00.652] } [15:32:00.652] else if (inherits(cond, "condition")) { [15:32:00.652] if (!is.null(pattern)) { [15:32:00.652] computeRestarts <- base::computeRestarts [15:32:00.652] grepl <- base::grepl [15:32:00.652] restarts <- computeRestarts(cond) [15:32:00.652] for (restart in restarts) { [15:32:00.652] name <- restart$name [15:32:00.652] if (is.null(name)) [15:32:00.652] next [15:32:00.652] if (!grepl(pattern, name)) [15:32:00.652] next [15:32:00.652] invokeRestart(restart) [15:32:00.652] muffled <- TRUE [15:32:00.652] break [15:32:00.652] } [15:32:00.652] } [15:32:00.652] } [15:32:00.652] invisible(muffled) [15:32:00.652] } [15:32:00.652] muffleCondition(cond, pattern = "^muffle") [15:32:00.652] } [15:32:00.652] } [15:32:00.652] else { [15:32:00.652] if (TRUE) { [15:32:00.652] muffleCondition <- function (cond, pattern = "^muffle") [15:32:00.652] { [15:32:00.652] inherits <- base::inherits [15:32:00.652] invokeRestart <- base::invokeRestart [15:32:00.652] is.null <- base::is.null [15:32:00.652] muffled <- FALSE [15:32:00.652] if (inherits(cond, "message")) { [15:32:00.652] muffled <- grepl(pattern, "muffleMessage") [15:32:00.652] if (muffled) [15:32:00.652] invokeRestart("muffleMessage") [15:32:00.652] } [15:32:00.652] else if (inherits(cond, "warning")) { [15:32:00.652] muffled <- grepl(pattern, "muffleWarning") [15:32:00.652] if (muffled) [15:32:00.652] invokeRestart("muffleWarning") [15:32:00.652] } [15:32:00.652] else if (inherits(cond, "condition")) { [15:32:00.652] if (!is.null(pattern)) { [15:32:00.652] computeRestarts <- base::computeRestarts [15:32:00.652] grepl <- base::grepl [15:32:00.652] restarts <- computeRestarts(cond) [15:32:00.652] for (restart in restarts) { [15:32:00.652] name <- restart$name [15:32:00.652] if (is.null(name)) [15:32:00.652] next [15:32:00.652] if (!grepl(pattern, name)) [15:32:00.652] next [15:32:00.652] invokeRestart(restart) [15:32:00.652] muffled <- TRUE [15:32:00.652] break [15:32:00.652] } [15:32:00.652] } [15:32:00.652] } [15:32:00.652] invisible(muffled) [15:32:00.652] } [15:32:00.652] muffleCondition(cond, pattern = "^muffle") [15:32:00.652] } [15:32:00.652] } [15:32:00.652] } [15:32:00.652] })) [15:32:00.652] }, error = function(ex) { [15:32:00.652] base::structure(base::list(value = NULL, visible = NULL, [15:32:00.652] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:32:00.652] ...future.rng), started = ...future.startTime, [15:32:00.652] finished = Sys.time(), session_uuid = NA_character_, [15:32:00.652] version = "1.8"), class = "FutureResult") [15:32:00.652] }, finally = { [15:32:00.652] if (!identical(...future.workdir, getwd())) [15:32:00.652] setwd(...future.workdir) [15:32:00.652] { [15:32:00.652] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:32:00.652] ...future.oldOptions$nwarnings <- NULL [15:32:00.652] } [15:32:00.652] base::options(...future.oldOptions) [15:32:00.652] if (.Platform$OS.type == "windows") { [15:32:00.652] old_names <- names(...future.oldEnvVars) [15:32:00.652] envs <- base::Sys.getenv() [15:32:00.652] names <- names(envs) [15:32:00.652] common <- intersect(names, old_names) [15:32:00.652] added <- setdiff(names, old_names) [15:32:00.652] removed <- setdiff(old_names, names) [15:32:00.652] changed <- common[...future.oldEnvVars[common] != [15:32:00.652] envs[common]] [15:32:00.652] NAMES <- toupper(changed) [15:32:00.652] args <- list() [15:32:00.652] for (kk in seq_along(NAMES)) { [15:32:00.652] name <- changed[[kk]] [15:32:00.652] NAME <- NAMES[[kk]] [15:32:00.652] if (name != NAME && is.element(NAME, old_names)) [15:32:00.652] next [15:32:00.652] args[[name]] <- ...future.oldEnvVars[[name]] [15:32:00.652] } [15:32:00.652] NAMES <- toupper(added) [15:32:00.652] for (kk in seq_along(NAMES)) { [15:32:00.652] name <- added[[kk]] [15:32:00.652] NAME <- NAMES[[kk]] [15:32:00.652] if (name != NAME && is.element(NAME, old_names)) [15:32:00.652] next [15:32:00.652] args[[name]] <- "" [15:32:00.652] } [15:32:00.652] NAMES <- toupper(removed) [15:32:00.652] for (kk in seq_along(NAMES)) { [15:32:00.652] name <- removed[[kk]] [15:32:00.652] NAME <- NAMES[[kk]] [15:32:00.652] if (name != NAME && is.element(NAME, old_names)) [15:32:00.652] next [15:32:00.652] args[[name]] <- ...future.oldEnvVars[[name]] [15:32:00.652] } [15:32:00.652] if (length(args) > 0) [15:32:00.652] base::do.call(base::Sys.setenv, args = args) [15:32:00.652] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:32:00.652] } [15:32:00.652] else { [15:32:00.652] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:32:00.652] } [15:32:00.652] { [15:32:00.652] if (base::length(...future.futureOptionsAdded) > [15:32:00.652] 0L) { [15:32:00.652] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:32:00.652] base::names(opts) <- ...future.futureOptionsAdded [15:32:00.652] base::options(opts) [15:32:00.652] } [15:32:00.652] { [15:32:00.652] { [15:32:00.652] base::options(mc.cores = ...future.mc.cores.old) [15:32:00.652] NULL [15:32:00.652] } [15:32:00.652] options(future.plan = NULL) [15:32:00.652] if (is.na(NA_character_)) [15:32:00.652] Sys.unsetenv("R_FUTURE_PLAN") [15:32:00.652] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:32:00.652] future::plan(...future.strategy.old, .cleanup = FALSE, [15:32:00.652] .init = FALSE) [15:32:00.652] } [15:32:00.652] } [15:32:00.652] } [15:32:00.652] }) [15:32:00.652] if (TRUE) { [15:32:00.652] base::sink(type = "output", split = FALSE) [15:32:00.652] if (TRUE) { [15:32:00.652] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:32:00.652] } [15:32:00.652] else { [15:32:00.652] ...future.result["stdout"] <- base::list(NULL) [15:32:00.652] } [15:32:00.652] base::close(...future.stdout) [15:32:00.652] ...future.stdout <- NULL [15:32:00.652] } [15:32:00.652] ...future.result$conditions <- ...future.conditions [15:32:00.652] ...future.result$finished <- base::Sys.time() [15:32:00.652] ...future.result [15:32:00.652] } [15:32:00.664] Exporting 6 global objects (1.93 KiB) to cluster node #1 ... [15:32:00.664] Exporting '...future.FUN' (1.88 KiB) to cluster node #1 ... [15:32:00.665] Exporting '...future.FUN' (1.88 KiB) to cluster node #1 ... DONE [15:32:00.665] Exporting 'a' (56 bytes) to cluster node #1 ... [15:32:00.666] Exporting 'a' (56 bytes) to cluster node #1 ... DONE [15:32:00.666] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [15:32:00.667] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [15:32:00.719] Exporting '...future.elements_ii' (273.44 KiB) to cluster node #1 ... [15:32:00.725] Exporting '...future.elements_ii' (273.44 KiB) to cluster node #1 ... DONE [15:32:00.725] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:32:00.726] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:32:00.727] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:32:00.728] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:32:00.729] Exporting 6 global objects (1.93 KiB) to cluster node #1 ... DONE [15:32:00.730] MultisessionFuture started [15:32:00.731] - Launch lazy future ... done [15:32:00.731] run() for 'MultisessionFuture' ... done [15:32:00.731] Created future: [15:32:00.780] receiveMessageFromWorker() for ClusterFuture ... [15:32:00.781] - Validating connection of MultisessionFuture [15:32:00.782] - received message: FutureResult [15:32:00.782] - Received FutureResult [15:32:00.782] - Erased future from FutureRegistry [15:32:00.783] result() for ClusterFuture ... [15:32:00.783] - result already collected: FutureResult [15:32:00.783] result() for ClusterFuture ... done [15:32:00.783] receiveMessageFromWorker() for ClusterFuture ... done [15:32:00.732] MultisessionFuture: [15:32:00.732] Label: 'future_lapply-1' [15:32:00.732] Expression: [15:32:00.732] { [15:32:00.732] do.call(function(...) { [15:32:00.732] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:00.732] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:32:00.732] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:00.732] on.exit(options(oopts), add = TRUE) [15:32:00.732] } [15:32:00.732] { [15:32:00.732] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:32:00.732] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:00.732] ...future.FUN(...future.X_jj, ...) [15:32:00.732] }) [15:32:00.732] } [15:32:00.732] }, args = future.call.arguments) [15:32:00.732] } [15:32:00.732] Lazy evaluation: FALSE [15:32:00.732] Asynchronous evaluation: TRUE [15:32:00.732] Local evaluation: TRUE [15:32:00.732] Environment: R_GlobalEnv [15:32:00.732] Capture standard output: TRUE [15:32:00.732] Capture condition classes: 'condition' (excluding 'nothing') [15:32:00.732] Globals: 6 objects totaling 275.37 KiB (function '...future.FUN' of 1.88 KiB, numeric 'a' of 56 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 273.44 KiB, NULL '...future.seeds_ii' of 0 bytes, ...) [15:32:00.732] Packages: [15:32:00.732] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:32:00.732] Resolved: TRUE [15:32:00.732] Value: [15:32:00.732] Conditions captured: [15:32:00.732] Early signaling: FALSE [15:32:00.732] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:32:00.732] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:32:00.784] Chunk #1 of 2 ... DONE [15:32:00.784] Chunk #2 of 2 ... [15:32:00.785] - Finding globals in 'X' for chunk #2 ... [15:32:00.786] getGlobalsAndPackages() ... [15:32:00.786] Searching for globals... [15:32:00.791] [15:32:00.791] Searching for globals ... DONE [15:32:00.792] - globals: [0] [15:32:00.792] getGlobalsAndPackages() ... DONE [15:32:00.792] + additional globals found: [n=0] [15:32:00.792] + additional namespaces needed: [n=0] [15:32:00.793] - Finding globals in 'X' for chunk #2 ... DONE [15:32:00.793] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:32:00.793] - seeds: [15:32:00.793] - All globals exported: [n=6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:00.794] getGlobalsAndPackages() ... [15:32:00.794] - globals passed as-is: [6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:00.794] Resolving globals: FALSE [15:32:00.794] Tweak future expression to call with '...' arguments ... [15:32:00.795] { [15:32:00.795] do.call(function(...) { [15:32:00.795] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:00.795] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:32:00.795] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:00.795] on.exit(options(oopts), add = TRUE) [15:32:00.795] } [15:32:00.795] { [15:32:00.795] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:32:00.795] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:00.795] ...future.FUN(...future.X_jj, ...) [15:32:00.795] }) [15:32:00.795] } [15:32:00.795] }, args = future.call.arguments) [15:32:00.795] } [15:32:00.795] Tweak future expression to call with '...' arguments ... DONE [15:32:00.796] - globals: [6] '...future.FUN', 'a', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:00.796] [15:32:00.797] getGlobalsAndPackages() ... DONE [15:32:00.797] run() for 'Future' ... [15:32:00.797] - state: 'created' [15:32:00.798] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:32:00.815] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:32:00.815] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:32:00.815] - Field: 'node' [15:32:00.816] - Field: 'label' [15:32:00.816] - Field: 'local' [15:32:00.816] - Field: 'owner' [15:32:00.817] - Field: 'envir' [15:32:00.817] - Field: 'workers' [15:32:00.817] - Field: 'packages' [15:32:00.817] - Field: 'gc' [15:32:00.818] - Field: 'conditions' [15:32:00.818] - Field: 'persistent' [15:32:00.818] - Field: 'expr' [15:32:00.818] - Field: 'uuid' [15:32:00.819] - Field: 'seed' [15:32:00.819] - Field: 'version' [15:32:00.819] - Field: 'result' [15:32:00.819] - Field: 'asynchronous' [15:32:00.820] - Field: 'calls' [15:32:00.820] - Field: 'globals' [15:32:00.820] - Field: 'stdout' [15:32:00.820] - Field: 'earlySignal' [15:32:00.821] - Field: 'lazy' [15:32:00.821] - Field: 'state' [15:32:00.821] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:32:00.821] - Launch lazy future ... [15:32:00.822] Packages needed by the future expression (n = 0): [15:32:00.822] Packages needed by future strategies (n = 0): [15:32:00.823] { [15:32:00.823] { [15:32:00.823] { [15:32:00.823] ...future.startTime <- base::Sys.time() [15:32:00.823] { [15:32:00.823] { [15:32:00.823] { [15:32:00.823] { [15:32:00.823] base::local({ [15:32:00.823] has_future <- base::requireNamespace("future", [15:32:00.823] quietly = TRUE) [15:32:00.823] if (has_future) { [15:32:00.823] ns <- base::getNamespace("future") [15:32:00.823] version <- ns[[".package"]][["version"]] [15:32:00.823] if (is.null(version)) [15:32:00.823] version <- utils::packageVersion("future") [15:32:00.823] } [15:32:00.823] else { [15:32:00.823] version <- NULL [15:32:00.823] } [15:32:00.823] if (!has_future || version < "1.8.0") { [15:32:00.823] info <- base::c(r_version = base::gsub("R version ", [15:32:00.823] "", base::R.version$version.string), [15:32:00.823] platform = base::sprintf("%s (%s-bit)", [15:32:00.823] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:32:00.823] os = base::paste(base::Sys.info()[base::c("sysname", [15:32:00.823] "release", "version")], collapse = " "), [15:32:00.823] hostname = base::Sys.info()[["nodename"]]) [15:32:00.823] info <- base::sprintf("%s: %s", base::names(info), [15:32:00.823] info) [15:32:00.823] info <- base::paste(info, collapse = "; ") [15:32:00.823] if (!has_future) { [15:32:00.823] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:32:00.823] info) [15:32:00.823] } [15:32:00.823] else { [15:32:00.823] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:32:00.823] info, version) [15:32:00.823] } [15:32:00.823] base::stop(msg) [15:32:00.823] } [15:32:00.823] }) [15:32:00.823] } [15:32:00.823] ...future.mc.cores.old <- base::getOption("mc.cores") [15:32:00.823] base::options(mc.cores = 1L) [15:32:00.823] } [15:32:00.823] ...future.strategy.old <- future::plan("list") [15:32:00.823] options(future.plan = NULL) [15:32:00.823] Sys.unsetenv("R_FUTURE_PLAN") [15:32:00.823] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:32:00.823] } [15:32:00.823] ...future.workdir <- getwd() [15:32:00.823] } [15:32:00.823] ...future.oldOptions <- base::as.list(base::.Options) [15:32:00.823] ...future.oldEnvVars <- base::Sys.getenv() [15:32:00.823] } [15:32:00.823] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:32:00.823] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:32:00.823] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:32:00.823] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:32:00.823] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:32:00.823] future.stdout.windows.reencode = NULL, width = 80L) [15:32:00.823] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:32:00.823] base::names(...future.oldOptions)) [15:32:00.823] } [15:32:00.823] if (FALSE) { [15:32:00.823] } [15:32:00.823] else { [15:32:00.823] if (TRUE) { [15:32:00.823] ...future.stdout <- base::rawConnection(base::raw(0L), [15:32:00.823] open = "w") [15:32:00.823] } [15:32:00.823] else { [15:32:00.823] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:32:00.823] windows = "NUL", "/dev/null"), open = "w") [15:32:00.823] } [15:32:00.823] base::sink(...future.stdout, type = "output", split = FALSE) [15:32:00.823] base::on.exit(if (!base::is.null(...future.stdout)) { [15:32:00.823] base::sink(type = "output", split = FALSE) [15:32:00.823] base::close(...future.stdout) [15:32:00.823] }, add = TRUE) [15:32:00.823] } [15:32:00.823] ...future.frame <- base::sys.nframe() [15:32:00.823] ...future.conditions <- base::list() [15:32:00.823] ...future.rng <- base::globalenv()$.Random.seed [15:32:00.823] if (FALSE) { [15:32:00.823] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:32:00.823] "...future.value", "...future.globalenv.names", ".Random.seed") [15:32:00.823] } [15:32:00.823] ...future.result <- base::tryCatch({ [15:32:00.823] base::withCallingHandlers({ [15:32:00.823] ...future.value <- base::withVisible(base::local({ [15:32:00.823] ...future.makeSendCondition <- base::local({ [15:32:00.823] sendCondition <- NULL [15:32:00.823] function(frame = 1L) { [15:32:00.823] if (is.function(sendCondition)) [15:32:00.823] return(sendCondition) [15:32:00.823] ns <- getNamespace("parallel") [15:32:00.823] if (exists("sendData", mode = "function", [15:32:00.823] envir = ns)) { [15:32:00.823] parallel_sendData <- get("sendData", mode = "function", [15:32:00.823] envir = ns) [15:32:00.823] envir <- sys.frame(frame) [15:32:00.823] master <- NULL [15:32:00.823] while (!identical(envir, .GlobalEnv) && [15:32:00.823] !identical(envir, emptyenv())) { [15:32:00.823] if (exists("master", mode = "list", envir = envir, [15:32:00.823] inherits = FALSE)) { [15:32:00.823] master <- get("master", mode = "list", [15:32:00.823] envir = envir, inherits = FALSE) [15:32:00.823] if (inherits(master, c("SOCKnode", [15:32:00.823] "SOCK0node"))) { [15:32:00.823] sendCondition <<- function(cond) { [15:32:00.823] data <- list(type = "VALUE", value = cond, [15:32:00.823] success = TRUE) [15:32:00.823] parallel_sendData(master, data) [15:32:00.823] } [15:32:00.823] return(sendCondition) [15:32:00.823] } [15:32:00.823] } [15:32:00.823] frame <- frame + 1L [15:32:00.823] envir <- sys.frame(frame) [15:32:00.823] } [15:32:00.823] } [15:32:00.823] sendCondition <<- function(cond) NULL [15:32:00.823] } [15:32:00.823] }) [15:32:00.823] withCallingHandlers({ [15:32:00.823] { [15:32:00.823] do.call(function(...) { [15:32:00.823] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:00.823] if (!identical(...future.globals.maxSize.org, [15:32:00.823] ...future.globals.maxSize)) { [15:32:00.823] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:00.823] on.exit(options(oopts), add = TRUE) [15:32:00.823] } [15:32:00.823] { [15:32:00.823] lapply(seq_along(...future.elements_ii), [15:32:00.823] FUN = function(jj) { [15:32:00.823] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:00.823] ...future.FUN(...future.X_jj, ...) [15:32:00.823] }) [15:32:00.823] } [15:32:00.823] }, args = future.call.arguments) [15:32:00.823] } [15:32:00.823] }, immediateCondition = function(cond) { [15:32:00.823] sendCondition <- ...future.makeSendCondition() [15:32:00.823] sendCondition(cond) [15:32:00.823] muffleCondition <- function (cond, pattern = "^muffle") [15:32:00.823] { [15:32:00.823] inherits <- base::inherits [15:32:00.823] invokeRestart <- base::invokeRestart [15:32:00.823] is.null <- base::is.null [15:32:00.823] muffled <- FALSE [15:32:00.823] if (inherits(cond, "message")) { [15:32:00.823] muffled <- grepl(pattern, "muffleMessage") [15:32:00.823] if (muffled) [15:32:00.823] invokeRestart("muffleMessage") [15:32:00.823] } [15:32:00.823] else if (inherits(cond, "warning")) { [15:32:00.823] muffled <- grepl(pattern, "muffleWarning") [15:32:00.823] if (muffled) [15:32:00.823] invokeRestart("muffleWarning") [15:32:00.823] } [15:32:00.823] else if (inherits(cond, "condition")) { [15:32:00.823] if (!is.null(pattern)) { [15:32:00.823] computeRestarts <- base::computeRestarts [15:32:00.823] grepl <- base::grepl [15:32:00.823] restarts <- computeRestarts(cond) [15:32:00.823] for (restart in restarts) { [15:32:00.823] name <- restart$name [15:32:00.823] if (is.null(name)) [15:32:00.823] next [15:32:00.823] if (!grepl(pattern, name)) [15:32:00.823] next [15:32:00.823] invokeRestart(restart) [15:32:00.823] muffled <- TRUE [15:32:00.823] break [15:32:00.823] } [15:32:00.823] } [15:32:00.823] } [15:32:00.823] invisible(muffled) [15:32:00.823] } [15:32:00.823] muffleCondition(cond) [15:32:00.823] }) [15:32:00.823] })) [15:32:00.823] future::FutureResult(value = ...future.value$value, [15:32:00.823] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:32:00.823] ...future.rng), globalenv = if (FALSE) [15:32:00.823] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:32:00.823] ...future.globalenv.names)) [15:32:00.823] else NULL, started = ...future.startTime, version = "1.8") [15:32:00.823] }, condition = base::local({ [15:32:00.823] c <- base::c [15:32:00.823] inherits <- base::inherits [15:32:00.823] invokeRestart <- base::invokeRestart [15:32:00.823] length <- base::length [15:32:00.823] list <- base::list [15:32:00.823] seq.int <- base::seq.int [15:32:00.823] signalCondition <- base::signalCondition [15:32:00.823] sys.calls <- base::sys.calls [15:32:00.823] `[[` <- base::`[[` [15:32:00.823] `+` <- base::`+` [15:32:00.823] `<<-` <- base::`<<-` [15:32:00.823] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:32:00.823] calls[seq.int(from = from + 12L, to = length(calls) - [15:32:00.823] 3L)] [15:32:00.823] } [15:32:00.823] function(cond) { [15:32:00.823] is_error <- inherits(cond, "error") [15:32:00.823] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:32:00.823] NULL) [15:32:00.823] if (is_error) { [15:32:00.823] sessionInformation <- function() { [15:32:00.823] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:32:00.823] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:32:00.823] search = base::search(), system = base::Sys.info()) [15:32:00.823] } [15:32:00.823] ...future.conditions[[length(...future.conditions) + [15:32:00.823] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:32:00.823] cond$call), session = sessionInformation(), [15:32:00.823] timestamp = base::Sys.time(), signaled = 0L) [15:32:00.823] signalCondition(cond) [15:32:00.823] } [15:32:00.823] else if (!ignore && TRUE && inherits(cond, c("condition", [15:32:00.823] "immediateCondition"))) { [15:32:00.823] signal <- TRUE && inherits(cond, "immediateCondition") [15:32:00.823] ...future.conditions[[length(...future.conditions) + [15:32:00.823] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:32:00.823] if (TRUE && !signal) { [15:32:00.823] muffleCondition <- function (cond, pattern = "^muffle") [15:32:00.823] { [15:32:00.823] inherits <- base::inherits [15:32:00.823] invokeRestart <- base::invokeRestart [15:32:00.823] is.null <- base::is.null [15:32:00.823] muffled <- FALSE [15:32:00.823] if (inherits(cond, "message")) { [15:32:00.823] muffled <- grepl(pattern, "muffleMessage") [15:32:00.823] if (muffled) [15:32:00.823] invokeRestart("muffleMessage") [15:32:00.823] } [15:32:00.823] else if (inherits(cond, "warning")) { [15:32:00.823] muffled <- grepl(pattern, "muffleWarning") [15:32:00.823] if (muffled) [15:32:00.823] invokeRestart("muffleWarning") [15:32:00.823] } [15:32:00.823] else if (inherits(cond, "condition")) { [15:32:00.823] if (!is.null(pattern)) { [15:32:00.823] computeRestarts <- base::computeRestarts [15:32:00.823] grepl <- base::grepl [15:32:00.823] restarts <- computeRestarts(cond) [15:32:00.823] for (restart in restarts) { [15:32:00.823] name <- restart$name [15:32:00.823] if (is.null(name)) [15:32:00.823] next [15:32:00.823] if (!grepl(pattern, name)) [15:32:00.823] next [15:32:00.823] invokeRestart(restart) [15:32:00.823] muffled <- TRUE [15:32:00.823] break [15:32:00.823] } [15:32:00.823] } [15:32:00.823] } [15:32:00.823] invisible(muffled) [15:32:00.823] } [15:32:00.823] muffleCondition(cond, pattern = "^muffle") [15:32:00.823] } [15:32:00.823] } [15:32:00.823] else { [15:32:00.823] if (TRUE) { [15:32:00.823] muffleCondition <- function (cond, pattern = "^muffle") [15:32:00.823] { [15:32:00.823] inherits <- base::inherits [15:32:00.823] invokeRestart <- base::invokeRestart [15:32:00.823] is.null <- base::is.null [15:32:00.823] muffled <- FALSE [15:32:00.823] if (inherits(cond, "message")) { [15:32:00.823] muffled <- grepl(pattern, "muffleMessage") [15:32:00.823] if (muffled) [15:32:00.823] invokeRestart("muffleMessage") [15:32:00.823] } [15:32:00.823] else if (inherits(cond, "warning")) { [15:32:00.823] muffled <- grepl(pattern, "muffleWarning") [15:32:00.823] if (muffled) [15:32:00.823] invokeRestart("muffleWarning") [15:32:00.823] } [15:32:00.823] else if (inherits(cond, "condition")) { [15:32:00.823] if (!is.null(pattern)) { [15:32:00.823] computeRestarts <- base::computeRestarts [15:32:00.823] grepl <- base::grepl [15:32:00.823] restarts <- computeRestarts(cond) [15:32:00.823] for (restart in restarts) { [15:32:00.823] name <- restart$name [15:32:00.823] if (is.null(name)) [15:32:00.823] next [15:32:00.823] if (!grepl(pattern, name)) [15:32:00.823] next [15:32:00.823] invokeRestart(restart) [15:32:00.823] muffled <- TRUE [15:32:00.823] break [15:32:00.823] } [15:32:00.823] } [15:32:00.823] } [15:32:00.823] invisible(muffled) [15:32:00.823] } [15:32:00.823] muffleCondition(cond, pattern = "^muffle") [15:32:00.823] } [15:32:00.823] } [15:32:00.823] } [15:32:00.823] })) [15:32:00.823] }, error = function(ex) { [15:32:00.823] base::structure(base::list(value = NULL, visible = NULL, [15:32:00.823] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:32:00.823] ...future.rng), started = ...future.startTime, [15:32:00.823] finished = Sys.time(), session_uuid = NA_character_, [15:32:00.823] version = "1.8"), class = "FutureResult") [15:32:00.823] }, finally = { [15:32:00.823] if (!identical(...future.workdir, getwd())) [15:32:00.823] setwd(...future.workdir) [15:32:00.823] { [15:32:00.823] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:32:00.823] ...future.oldOptions$nwarnings <- NULL [15:32:00.823] } [15:32:00.823] base::options(...future.oldOptions) [15:32:00.823] if (.Platform$OS.type == "windows") { [15:32:00.823] old_names <- names(...future.oldEnvVars) [15:32:00.823] envs <- base::Sys.getenv() [15:32:00.823] names <- names(envs) [15:32:00.823] common <- intersect(names, old_names) [15:32:00.823] added <- setdiff(names, old_names) [15:32:00.823] removed <- setdiff(old_names, names) [15:32:00.823] changed <- common[...future.oldEnvVars[common] != [15:32:00.823] envs[common]] [15:32:00.823] NAMES <- toupper(changed) [15:32:00.823] args <- list() [15:32:00.823] for (kk in seq_along(NAMES)) { [15:32:00.823] name <- changed[[kk]] [15:32:00.823] NAME <- NAMES[[kk]] [15:32:00.823] if (name != NAME && is.element(NAME, old_names)) [15:32:00.823] next [15:32:00.823] args[[name]] <- ...future.oldEnvVars[[name]] [15:32:00.823] } [15:32:00.823] NAMES <- toupper(added) [15:32:00.823] for (kk in seq_along(NAMES)) { [15:32:00.823] name <- added[[kk]] [15:32:00.823] NAME <- NAMES[[kk]] [15:32:00.823] if (name != NAME && is.element(NAME, old_names)) [15:32:00.823] next [15:32:00.823] args[[name]] <- "" [15:32:00.823] } [15:32:00.823] NAMES <- toupper(removed) [15:32:00.823] for (kk in seq_along(NAMES)) { [15:32:00.823] name <- removed[[kk]] [15:32:00.823] NAME <- NAMES[[kk]] [15:32:00.823] if (name != NAME && is.element(NAME, old_names)) [15:32:00.823] next [15:32:00.823] args[[name]] <- ...future.oldEnvVars[[name]] [15:32:00.823] } [15:32:00.823] if (length(args) > 0) [15:32:00.823] base::do.call(base::Sys.setenv, args = args) [15:32:00.823] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:32:00.823] } [15:32:00.823] else { [15:32:00.823] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:32:00.823] } [15:32:00.823] { [15:32:00.823] if (base::length(...future.futureOptionsAdded) > [15:32:00.823] 0L) { [15:32:00.823] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:32:00.823] base::names(opts) <- ...future.futureOptionsAdded [15:32:00.823] base::options(opts) [15:32:00.823] } [15:32:00.823] { [15:32:00.823] { [15:32:00.823] base::options(mc.cores = ...future.mc.cores.old) [15:32:00.823] NULL [15:32:00.823] } [15:32:00.823] options(future.plan = NULL) [15:32:00.823] if (is.na(NA_character_)) [15:32:00.823] Sys.unsetenv("R_FUTURE_PLAN") [15:32:00.823] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:32:00.823] future::plan(...future.strategy.old, .cleanup = FALSE, [15:32:00.823] .init = FALSE) [15:32:00.823] } [15:32:00.823] } [15:32:00.823] } [15:32:00.823] }) [15:32:00.823] if (TRUE) { [15:32:00.823] base::sink(type = "output", split = FALSE) [15:32:00.823] if (TRUE) { [15:32:00.823] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:32:00.823] } [15:32:00.823] else { [15:32:00.823] ...future.result["stdout"] <- base::list(NULL) [15:32:00.823] } [15:32:00.823] base::close(...future.stdout) [15:32:00.823] ...future.stdout <- NULL [15:32:00.823] } [15:32:00.823] ...future.result$conditions <- ...future.conditions [15:32:00.823] ...future.result$finished <- base::Sys.time() [15:32:00.823] ...future.result [15:32:00.823] } [15:32:00.831] Exporting 6 global objects (1.93 KiB) to cluster node #1 ... [15:32:00.832] Exporting '...future.FUN' (1.88 KiB) to cluster node #1 ... [15:32:00.833] Exporting '...future.FUN' (1.88 KiB) to cluster node #1 ... DONE [15:32:00.833] Exporting 'a' (56 bytes) to cluster node #1 ... [15:32:00.834] Exporting 'a' (56 bytes) to cluster node #1 ... DONE [15:32:00.834] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [15:32:00.835] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [15:32:00.872] Exporting '...future.elements_ii' (273.44 KiB) to cluster node #1 ... [15:32:00.874] Exporting '...future.elements_ii' (273.44 KiB) to cluster node #1 ... DONE [15:32:00.874] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:32:00.875] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:32:00.875] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:32:00.876] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:32:00.876] Exporting 6 global objects (1.93 KiB) to cluster node #1 ... DONE [15:32:00.877] MultisessionFuture started [15:32:00.877] - Launch lazy future ... done [15:32:00.877] run() for 'MultisessionFuture' ... done [15:32:00.877] Created future: [15:32:00.916] receiveMessageFromWorker() for ClusterFuture ... [15:32:00.916] - Validating connection of MultisessionFuture [15:32:00.917] - received message: FutureResult [15:32:00.917] - Received FutureResult [15:32:00.917] - Erased future from FutureRegistry [15:32:00.918] result() for ClusterFuture ... [15:32:00.918] - result already collected: FutureResult [15:32:00.918] result() for ClusterFuture ... done [15:32:00.918] receiveMessageFromWorker() for ClusterFuture ... done [15:32:00.877] MultisessionFuture: [15:32:00.877] Label: 'future_lapply-2' [15:32:00.877] Expression: [15:32:00.877] { [15:32:00.877] do.call(function(...) { [15:32:00.877] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:00.877] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:32:00.877] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:00.877] on.exit(options(oopts), add = TRUE) [15:32:00.877] } [15:32:00.877] { [15:32:00.877] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:32:00.877] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:00.877] ...future.FUN(...future.X_jj, ...) [15:32:00.877] }) [15:32:00.877] } [15:32:00.877] }, args = future.call.arguments) [15:32:00.877] } [15:32:00.877] Lazy evaluation: FALSE [15:32:00.877] Asynchronous evaluation: TRUE [15:32:00.877] Local evaluation: TRUE [15:32:00.877] Environment: R_GlobalEnv [15:32:00.877] Capture standard output: TRUE [15:32:00.877] Capture condition classes: 'condition' (excluding 'nothing') [15:32:00.877] Globals: 6 objects totaling 275.37 KiB (function '...future.FUN' of 1.88 KiB, numeric 'a' of 56 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 273.44 KiB, NULL '...future.seeds_ii' of 0 bytes, ...) [15:32:00.877] Packages: [15:32:00.877] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:32:00.877] Resolved: TRUE [15:32:00.877] Value: [15:32:00.877] Conditions captured: [15:32:00.877] Early signaling: FALSE [15:32:00.877] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:32:00.877] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:32:00.919] Chunk #2 of 2 ... DONE [15:32:00.919] Launching 2 futures (chunks) ... DONE [15:32:00.919] Resolving 2 futures (chunks) ... [15:32:00.919] resolve() on list ... [15:32:00.919] recursive: 0 [15:32:00.920] length: 2 [15:32:00.920] [15:32:00.920] Future #1 [15:32:00.920] result() for ClusterFuture ... [15:32:00.920] - result already collected: FutureResult [15:32:00.921] result() for ClusterFuture ... done [15:32:00.921] result() for ClusterFuture ... [15:32:00.921] - result already collected: FutureResult [15:32:00.921] result() for ClusterFuture ... done [15:32:00.921] signalConditionsASAP(MultisessionFuture, pos=1) ... [15:32:00.922] - nx: 2 [15:32:00.922] - relay: TRUE [15:32:00.922] - stdout: TRUE [15:32:00.922] - signal: TRUE [15:32:00.922] - resignal: FALSE [15:32:00.922] - force: TRUE [15:32:00.923] - relayed: [n=2] FALSE, FALSE [15:32:00.923] - queued futures: [n=2] FALSE, FALSE [15:32:00.923] - until=1 [15:32:00.923] - relaying element #1 [15:32:00.923] result() for ClusterFuture ... [15:32:00.923] - result already collected: FutureResult [15:32:00.924] result() for ClusterFuture ... done [15:32:00.924] result() for ClusterFuture ... [15:32:00.924] - result already collected: FutureResult [15:32:00.924] result() for ClusterFuture ... done [15:32:00.924] result() for ClusterFuture ... [15:32:00.924] - result already collected: FutureResult [15:32:00.925] result() for ClusterFuture ... done [15:32:00.925] result() for ClusterFuture ... [15:32:00.925] - result already collected: FutureResult [15:32:00.925] result() for ClusterFuture ... done [15:32:00.925] - relayed: [n=2] TRUE, FALSE [15:32:00.926] - queued futures: [n=2] TRUE, FALSE [15:32:00.926] signalConditionsASAP(MultisessionFuture, pos=1) ... done [15:32:00.926] length: 1 (resolved future 1) [15:32:00.926] Future #2 [15:32:00.926] result() for ClusterFuture ... [15:32:00.927] - result already collected: FutureResult [15:32:00.927] result() for ClusterFuture ... done [15:32:00.927] result() for ClusterFuture ... [15:32:00.927] - result already collected: FutureResult [15:32:00.927] result() for ClusterFuture ... done [15:32:00.927] signalConditionsASAP(MultisessionFuture, pos=2) ... [15:32:00.928] - nx: 2 [15:32:00.928] - relay: TRUE [15:32:00.928] - stdout: TRUE [15:32:00.928] - signal: TRUE [15:32:00.928] - resignal: FALSE [15:32:00.928] - force: TRUE [15:32:00.929] - relayed: [n=2] TRUE, FALSE [15:32:00.929] - queued futures: [n=2] TRUE, FALSE [15:32:00.929] - until=2 [15:32:00.929] - relaying element #2 [15:32:00.929] result() for ClusterFuture ... [15:32:00.929] - result already collected: FutureResult [15:32:00.930] result() for ClusterFuture ... done [15:32:00.930] result() for ClusterFuture ... [15:32:00.930] - result already collected: FutureResult [15:32:00.930] result() for ClusterFuture ... done [15:32:00.930] result() for ClusterFuture ... [15:32:00.931] - result already collected: FutureResult [15:32:00.931] result() for ClusterFuture ... done [15:32:00.931] result() for ClusterFuture ... [15:32:00.931] - result already collected: FutureResult [15:32:00.931] result() for ClusterFuture ... done [15:32:00.931] - relayed: [n=2] TRUE, TRUE [15:32:00.931] - queued futures: [n=2] TRUE, TRUE [15:32:00.932] signalConditionsASAP(MultisessionFuture, pos=2) ... done [15:32:00.932] length: 0 (resolved future 2) [15:32:00.932] Relaying remaining futures [15:32:00.932] signalConditionsASAP(NULL, pos=0) ... [15:32:00.932] - nx: 2 [15:32:00.933] - relay: TRUE [15:32:00.933] - stdout: TRUE [15:32:00.933] - signal: TRUE [15:32:00.933] - resignal: FALSE [15:32:00.933] - force: TRUE [15:32:00.933] - relayed: [n=2] TRUE, TRUE [15:32:00.933] - queued futures: [n=2] TRUE, TRUE - flush all [15:32:00.934] - relayed: [n=2] TRUE, TRUE [15:32:00.934] - queued futures: [n=2] TRUE, TRUE [15:32:00.934] signalConditionsASAP(NULL, pos=0) ... done [15:32:00.934] resolve() on list ... DONE [15:32:00.934] result() for ClusterFuture ... [15:32:00.935] - result already collected: FutureResult [15:32:00.935] result() for ClusterFuture ... done [15:32:00.935] result() for ClusterFuture ... [15:32:00.935] - result already collected: FutureResult [15:32:00.935] result() for ClusterFuture ... done [15:32:00.935] result() for ClusterFuture ... [15:32:00.936] - result already collected: FutureResult [15:32:00.936] result() for ClusterFuture ... done [15:32:00.936] result() for ClusterFuture ... [15:32:00.936] - result already collected: FutureResult [15:32:00.936] result() for ClusterFuture ... done [15:32:00.937] - Number of value chunks collected: 2 [15:32:00.937] Resolving 2 futures (chunks) ... DONE [15:32:00.937] Reducing values from 2 chunks ... [15:32:00.937] - Number of values collected after concatenation: 10000 [15:32:00.937] - Number of values expected: 10000 [15:32:00.938] Reducing values from 2 chunks ... DONE [15:32:00.938] future_lapply() ... DONE - future_lapply(x, FUN = table, ...) ... [15:32:00.939] future_lapply() ... [15:32:00.993] Number of chunks: 2 [15:32:00.994] getGlobalsAndPackagesXApply() ... [15:32:00.994] - future.globals: TRUE [15:32:00.994] getGlobalsAndPackages() ... [15:32:00.994] Searching for globals... [15:32:01.047] - 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<-' [15:32:01.047] Searching for globals ... DONE [15:32:01.047] Resolving globals: FALSE [15:32:01.050] The total size of the 1 globals is 345.92 KiB (354224 bytes) [15:32:01.050] The total size of the 1 globals exported for future expression ('FUN()') is 345.92 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (345.92 KiB of class 'function') [15:32:01.051] - globals: [1] 'FUN' [15:32:01.051] [15:32:01.051] getGlobalsAndPackages() ... DONE [15:32:01.051] - globals found/used: [n=1] 'FUN' [15:32:01.051] - needed namespaces: [n=0] [15:32:01.051] Finding globals ... DONE [15:32:01.052] - use_args: TRUE [15:32:01.052] - Getting '...' globals ... [15:32:01.052] resolve() on list ... [15:32:01.052] recursive: 0 [15:32:01.053] length: 1 [15:32:01.053] elements: '...' [15:32:01.053] length: 0 (resolved future 1) [15:32:01.053] resolve() on list ... DONE [15:32:01.053] - '...' content: [n=0] [15:32:01.054] List of 1 [15:32:01.054] $ ...: list() [15:32:01.054] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:32:01.054] - attr(*, "where")=List of 1 [15:32:01.054] ..$ ...: [15:32:01.054] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:32:01.054] - attr(*, "resolved")= logi TRUE [15:32:01.054] - attr(*, "total_size")= num NA [15:32:01.057] - Getting '...' globals ... DONE [15:32:01.057] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:32:01.057] List of 2 [15:32:01.057] $ ...future.FUN:function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [15:32:01.057] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [15:32:01.057] $ ... : list() [15:32:01.057] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:32:01.057] - attr(*, "where")=List of 2 [15:32:01.057] ..$ ...future.FUN: [15:32:01.057] ..$ ... : [15:32:01.057] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:32:01.057] - attr(*, "resolved")= logi FALSE [15:32:01.057] - attr(*, "total_size")= num 354224 [15:32:01.061] Packages to be attached in all futures: [n=0] [15:32:01.061] getGlobalsAndPackagesXApply() ... DONE [15:32:01.062] Number of futures (= number of chunks): 2 [15:32:01.062] Launching 2 futures (chunks) ... [15:32:01.062] Chunk #1 of 2 ... [15:32:01.062] - Finding globals in 'X' for chunk #1 ... [15:32:01.062] getGlobalsAndPackages() ... [15:32:01.063] Searching for globals... [15:32:01.063] [15:32:01.063] Searching for globals ... DONE [15:32:01.063] - globals: [0] [15:32:01.064] getGlobalsAndPackages() ... DONE [15:32:01.064] + additional globals found: [n=0] [15:32:01.064] + additional namespaces needed: [n=0] [15:32:01.064] - Finding globals in 'X' for chunk #1 ... DONE [15:32:01.064] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:32:01.064] - seeds: [15:32:01.065] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:01.065] getGlobalsAndPackages() ... [15:32:01.065] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:01.065] Resolving globals: FALSE [15:32:01.065] Tweak future expression to call with '...' arguments ... [15:32:01.066] { [15:32:01.066] do.call(function(...) { [15:32:01.066] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:01.066] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:32:01.066] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:01.066] on.exit(options(oopts), add = TRUE) [15:32:01.066] } [15:32:01.066] { [15:32:01.066] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:32:01.066] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:01.066] ...future.FUN(...future.X_jj, ...) [15:32:01.066] }) [15:32:01.066] } [15:32:01.066] }, args = future.call.arguments) [15:32:01.066] } [15:32:01.066] Tweak future expression to call with '...' arguments ... DONE [15:32:01.067] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:01.067] [15:32:01.067] getGlobalsAndPackages() ... DONE [15:32:01.067] run() for 'Future' ... [15:32:01.068] - state: 'created' [15:32:01.068] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:32:01.083] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:32:01.084] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:32:01.084] - Field: 'node' [15:32:01.084] - Field: 'label' [15:32:01.085] - Field: 'local' [15:32:01.085] - Field: 'owner' [15:32:01.085] - Field: 'envir' [15:32:01.086] - Field: 'workers' [15:32:01.086] - Field: 'packages' [15:32:01.086] - Field: 'gc' [15:32:01.087] - Field: 'conditions' [15:32:01.087] - Field: 'persistent' [15:32:01.087] - Field: 'expr' [15:32:01.088] - Field: 'uuid' [15:32:01.088] - Field: 'seed' [15:32:01.088] - Field: 'version' [15:32:01.089] - Field: 'result' [15:32:01.089] - Field: 'asynchronous' [15:32:01.089] - Field: 'calls' [15:32:01.090] - Field: 'globals' [15:32:01.090] - Field: 'stdout' [15:32:01.090] - Field: 'earlySignal' [15:32:01.091] - Field: 'lazy' [15:32:01.091] - Field: 'state' [15:32:01.091] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:32:01.091] - Launch lazy future ... [15:32:01.092] Packages needed by the future expression (n = 0): [15:32:01.092] Packages needed by future strategies (n = 0): [15:32:01.093] { [15:32:01.093] { [15:32:01.093] { [15:32:01.093] ...future.startTime <- base::Sys.time() [15:32:01.093] { [15:32:01.093] { [15:32:01.093] { [15:32:01.093] { [15:32:01.093] base::local({ [15:32:01.093] has_future <- base::requireNamespace("future", [15:32:01.093] quietly = TRUE) [15:32:01.093] if (has_future) { [15:32:01.093] ns <- base::getNamespace("future") [15:32:01.093] version <- ns[[".package"]][["version"]] [15:32:01.093] if (is.null(version)) [15:32:01.093] version <- utils::packageVersion("future") [15:32:01.093] } [15:32:01.093] else { [15:32:01.093] version <- NULL [15:32:01.093] } [15:32:01.093] if (!has_future || version < "1.8.0") { [15:32:01.093] info <- base::c(r_version = base::gsub("R version ", [15:32:01.093] "", base::R.version$version.string), [15:32:01.093] platform = base::sprintf("%s (%s-bit)", [15:32:01.093] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:32:01.093] os = base::paste(base::Sys.info()[base::c("sysname", [15:32:01.093] "release", "version")], collapse = " "), [15:32:01.093] hostname = base::Sys.info()[["nodename"]]) [15:32:01.093] info <- base::sprintf("%s: %s", base::names(info), [15:32:01.093] info) [15:32:01.093] info <- base::paste(info, collapse = "; ") [15:32:01.093] if (!has_future) { [15:32:01.093] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:32:01.093] info) [15:32:01.093] } [15:32:01.093] else { [15:32:01.093] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:32:01.093] info, version) [15:32:01.093] } [15:32:01.093] base::stop(msg) [15:32:01.093] } [15:32:01.093] }) [15:32:01.093] } [15:32:01.093] ...future.mc.cores.old <- base::getOption("mc.cores") [15:32:01.093] base::options(mc.cores = 1L) [15:32:01.093] } [15:32:01.093] ...future.strategy.old <- future::plan("list") [15:32:01.093] options(future.plan = NULL) [15:32:01.093] Sys.unsetenv("R_FUTURE_PLAN") [15:32:01.093] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:32:01.093] } [15:32:01.093] ...future.workdir <- getwd() [15:32:01.093] } [15:32:01.093] ...future.oldOptions <- base::as.list(base::.Options) [15:32:01.093] ...future.oldEnvVars <- base::Sys.getenv() [15:32:01.093] } [15:32:01.093] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:32:01.093] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:32:01.093] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:32:01.093] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:32:01.093] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:32:01.093] future.stdout.windows.reencode = NULL, width = 80L) [15:32:01.093] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:32:01.093] base::names(...future.oldOptions)) [15:32:01.093] } [15:32:01.093] if (FALSE) { [15:32:01.093] } [15:32:01.093] else { [15:32:01.093] if (TRUE) { [15:32:01.093] ...future.stdout <- base::rawConnection(base::raw(0L), [15:32:01.093] open = "w") [15:32:01.093] } [15:32:01.093] else { [15:32:01.093] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:32:01.093] windows = "NUL", "/dev/null"), open = "w") [15:32:01.093] } [15:32:01.093] base::sink(...future.stdout, type = "output", split = FALSE) [15:32:01.093] base::on.exit(if (!base::is.null(...future.stdout)) { [15:32:01.093] base::sink(type = "output", split = FALSE) [15:32:01.093] base::close(...future.stdout) [15:32:01.093] }, add = TRUE) [15:32:01.093] } [15:32:01.093] ...future.frame <- base::sys.nframe() [15:32:01.093] ...future.conditions <- base::list() [15:32:01.093] ...future.rng <- base::globalenv()$.Random.seed [15:32:01.093] if (FALSE) { [15:32:01.093] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:32:01.093] "...future.value", "...future.globalenv.names", ".Random.seed") [15:32:01.093] } [15:32:01.093] ...future.result <- base::tryCatch({ [15:32:01.093] base::withCallingHandlers({ [15:32:01.093] ...future.value <- base::withVisible(base::local({ [15:32:01.093] ...future.makeSendCondition <- base::local({ [15:32:01.093] sendCondition <- NULL [15:32:01.093] function(frame = 1L) { [15:32:01.093] if (is.function(sendCondition)) [15:32:01.093] return(sendCondition) [15:32:01.093] ns <- getNamespace("parallel") [15:32:01.093] if (exists("sendData", mode = "function", [15:32:01.093] envir = ns)) { [15:32:01.093] parallel_sendData <- get("sendData", mode = "function", [15:32:01.093] envir = ns) [15:32:01.093] envir <- sys.frame(frame) [15:32:01.093] master <- NULL [15:32:01.093] while (!identical(envir, .GlobalEnv) && [15:32:01.093] !identical(envir, emptyenv())) { [15:32:01.093] if (exists("master", mode = "list", envir = envir, [15:32:01.093] inherits = FALSE)) { [15:32:01.093] master <- get("master", mode = "list", [15:32:01.093] envir = envir, inherits = FALSE) [15:32:01.093] if (inherits(master, c("SOCKnode", [15:32:01.093] "SOCK0node"))) { [15:32:01.093] sendCondition <<- function(cond) { [15:32:01.093] data <- list(type = "VALUE", value = cond, [15:32:01.093] success = TRUE) [15:32:01.093] parallel_sendData(master, data) [15:32:01.093] } [15:32:01.093] return(sendCondition) [15:32:01.093] } [15:32:01.093] } [15:32:01.093] frame <- frame + 1L [15:32:01.093] envir <- sys.frame(frame) [15:32:01.093] } [15:32:01.093] } [15:32:01.093] sendCondition <<- function(cond) NULL [15:32:01.093] } [15:32:01.093] }) [15:32:01.093] withCallingHandlers({ [15:32:01.093] { [15:32:01.093] do.call(function(...) { [15:32:01.093] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:01.093] if (!identical(...future.globals.maxSize.org, [15:32:01.093] ...future.globals.maxSize)) { [15:32:01.093] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:01.093] on.exit(options(oopts), add = TRUE) [15:32:01.093] } [15:32:01.093] { [15:32:01.093] lapply(seq_along(...future.elements_ii), [15:32:01.093] FUN = function(jj) { [15:32:01.093] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:01.093] ...future.FUN(...future.X_jj, ...) [15:32:01.093] }) [15:32:01.093] } [15:32:01.093] }, args = future.call.arguments) [15:32:01.093] } [15:32:01.093] }, immediateCondition = function(cond) { [15:32:01.093] sendCondition <- ...future.makeSendCondition() [15:32:01.093] sendCondition(cond) [15:32:01.093] muffleCondition <- function (cond, pattern = "^muffle") [15:32:01.093] { [15:32:01.093] inherits <- base::inherits [15:32:01.093] invokeRestart <- base::invokeRestart [15:32:01.093] is.null <- base::is.null [15:32:01.093] muffled <- FALSE [15:32:01.093] if (inherits(cond, "message")) { [15:32:01.093] muffled <- grepl(pattern, "muffleMessage") [15:32:01.093] if (muffled) [15:32:01.093] invokeRestart("muffleMessage") [15:32:01.093] } [15:32:01.093] else if (inherits(cond, "warning")) { [15:32:01.093] muffled <- grepl(pattern, "muffleWarning") [15:32:01.093] if (muffled) [15:32:01.093] invokeRestart("muffleWarning") [15:32:01.093] } [15:32:01.093] else if (inherits(cond, "condition")) { [15:32:01.093] if (!is.null(pattern)) { [15:32:01.093] computeRestarts <- base::computeRestarts [15:32:01.093] grepl <- base::grepl [15:32:01.093] restarts <- computeRestarts(cond) [15:32:01.093] for (restart in restarts) { [15:32:01.093] name <- restart$name [15:32:01.093] if (is.null(name)) [15:32:01.093] next [15:32:01.093] if (!grepl(pattern, name)) [15:32:01.093] next [15:32:01.093] invokeRestart(restart) [15:32:01.093] muffled <- TRUE [15:32:01.093] break [15:32:01.093] } [15:32:01.093] } [15:32:01.093] } [15:32:01.093] invisible(muffled) [15:32:01.093] } [15:32:01.093] muffleCondition(cond) [15:32:01.093] }) [15:32:01.093] })) [15:32:01.093] future::FutureResult(value = ...future.value$value, [15:32:01.093] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:32:01.093] ...future.rng), globalenv = if (FALSE) [15:32:01.093] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:32:01.093] ...future.globalenv.names)) [15:32:01.093] else NULL, started = ...future.startTime, version = "1.8") [15:32:01.093] }, condition = base::local({ [15:32:01.093] c <- base::c [15:32:01.093] inherits <- base::inherits [15:32:01.093] invokeRestart <- base::invokeRestart [15:32:01.093] length <- base::length [15:32:01.093] list <- base::list [15:32:01.093] seq.int <- base::seq.int [15:32:01.093] signalCondition <- base::signalCondition [15:32:01.093] sys.calls <- base::sys.calls [15:32:01.093] `[[` <- base::`[[` [15:32:01.093] `+` <- base::`+` [15:32:01.093] `<<-` <- base::`<<-` [15:32:01.093] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:32:01.093] calls[seq.int(from = from + 12L, to = length(calls) - [15:32:01.093] 3L)] [15:32:01.093] } [15:32:01.093] function(cond) { [15:32:01.093] is_error <- inherits(cond, "error") [15:32:01.093] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:32:01.093] NULL) [15:32:01.093] if (is_error) { [15:32:01.093] sessionInformation <- function() { [15:32:01.093] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:32:01.093] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:32:01.093] search = base::search(), system = base::Sys.info()) [15:32:01.093] } [15:32:01.093] ...future.conditions[[length(...future.conditions) + [15:32:01.093] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:32:01.093] cond$call), session = sessionInformation(), [15:32:01.093] timestamp = base::Sys.time(), signaled = 0L) [15:32:01.093] signalCondition(cond) [15:32:01.093] } [15:32:01.093] else if (!ignore && TRUE && inherits(cond, c("condition", [15:32:01.093] "immediateCondition"))) { [15:32:01.093] signal <- TRUE && inherits(cond, "immediateCondition") [15:32:01.093] ...future.conditions[[length(...future.conditions) + [15:32:01.093] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:32:01.093] if (TRUE && !signal) { [15:32:01.093] muffleCondition <- function (cond, pattern = "^muffle") [15:32:01.093] { [15:32:01.093] inherits <- base::inherits [15:32:01.093] invokeRestart <- base::invokeRestart [15:32:01.093] is.null <- base::is.null [15:32:01.093] muffled <- FALSE [15:32:01.093] if (inherits(cond, "message")) { [15:32:01.093] muffled <- grepl(pattern, "muffleMessage") [15:32:01.093] if (muffled) [15:32:01.093] invokeRestart("muffleMessage") [15:32:01.093] } [15:32:01.093] else if (inherits(cond, "warning")) { [15:32:01.093] muffled <- grepl(pattern, "muffleWarning") [15:32:01.093] if (muffled) [15:32:01.093] invokeRestart("muffleWarning") [15:32:01.093] } [15:32:01.093] else if (inherits(cond, "condition")) { [15:32:01.093] if (!is.null(pattern)) { [15:32:01.093] computeRestarts <- base::computeRestarts [15:32:01.093] grepl <- base::grepl [15:32:01.093] restarts <- computeRestarts(cond) [15:32:01.093] for (restart in restarts) { [15:32:01.093] name <- restart$name [15:32:01.093] if (is.null(name)) [15:32:01.093] next [15:32:01.093] if (!grepl(pattern, name)) [15:32:01.093] next [15:32:01.093] invokeRestart(restart) [15:32:01.093] muffled <- TRUE [15:32:01.093] break [15:32:01.093] } [15:32:01.093] } [15:32:01.093] } [15:32:01.093] invisible(muffled) [15:32:01.093] } [15:32:01.093] muffleCondition(cond, pattern = "^muffle") [15:32:01.093] } [15:32:01.093] } [15:32:01.093] else { [15:32:01.093] if (TRUE) { [15:32:01.093] muffleCondition <- function (cond, pattern = "^muffle") [15:32:01.093] { [15:32:01.093] inherits <- base::inherits [15:32:01.093] invokeRestart <- base::invokeRestart [15:32:01.093] is.null <- base::is.null [15:32:01.093] muffled <- FALSE [15:32:01.093] if (inherits(cond, "message")) { [15:32:01.093] muffled <- grepl(pattern, "muffleMessage") [15:32:01.093] if (muffled) [15:32:01.093] invokeRestart("muffleMessage") [15:32:01.093] } [15:32:01.093] else if (inherits(cond, "warning")) { [15:32:01.093] muffled <- grepl(pattern, "muffleWarning") [15:32:01.093] if (muffled) [15:32:01.093] invokeRestart("muffleWarning") [15:32:01.093] } [15:32:01.093] else if (inherits(cond, "condition")) { [15:32:01.093] if (!is.null(pattern)) { [15:32:01.093] computeRestarts <- base::computeRestarts [15:32:01.093] grepl <- base::grepl [15:32:01.093] restarts <- computeRestarts(cond) [15:32:01.093] for (restart in restarts) { [15:32:01.093] name <- restart$name [15:32:01.093] if (is.null(name)) [15:32:01.093] next [15:32:01.093] if (!grepl(pattern, name)) [15:32:01.093] next [15:32:01.093] invokeRestart(restart) [15:32:01.093] muffled <- TRUE [15:32:01.093] break [15:32:01.093] } [15:32:01.093] } [15:32:01.093] } [15:32:01.093] invisible(muffled) [15:32:01.093] } [15:32:01.093] muffleCondition(cond, pattern = "^muffle") [15:32:01.093] } [15:32:01.093] } [15:32:01.093] } [15:32:01.093] })) [15:32:01.093] }, error = function(ex) { [15:32:01.093] base::structure(base::list(value = NULL, visible = NULL, [15:32:01.093] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:32:01.093] ...future.rng), started = ...future.startTime, [15:32:01.093] finished = Sys.time(), session_uuid = NA_character_, [15:32:01.093] version = "1.8"), class = "FutureResult") [15:32:01.093] }, finally = { [15:32:01.093] if (!identical(...future.workdir, getwd())) [15:32:01.093] setwd(...future.workdir) [15:32:01.093] { [15:32:01.093] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:32:01.093] ...future.oldOptions$nwarnings <- NULL [15:32:01.093] } [15:32:01.093] base::options(...future.oldOptions) [15:32:01.093] if (.Platform$OS.type == "windows") { [15:32:01.093] old_names <- names(...future.oldEnvVars) [15:32:01.093] envs <- base::Sys.getenv() [15:32:01.093] names <- names(envs) [15:32:01.093] common <- intersect(names, old_names) [15:32:01.093] added <- setdiff(names, old_names) [15:32:01.093] removed <- setdiff(old_names, names) [15:32:01.093] changed <- common[...future.oldEnvVars[common] != [15:32:01.093] envs[common]] [15:32:01.093] NAMES <- toupper(changed) [15:32:01.093] args <- list() [15:32:01.093] for (kk in seq_along(NAMES)) { [15:32:01.093] name <- changed[[kk]] [15:32:01.093] NAME <- NAMES[[kk]] [15:32:01.093] if (name != NAME && is.element(NAME, old_names)) [15:32:01.093] next [15:32:01.093] args[[name]] <- ...future.oldEnvVars[[name]] [15:32:01.093] } [15:32:01.093] NAMES <- toupper(added) [15:32:01.093] for (kk in seq_along(NAMES)) { [15:32:01.093] name <- added[[kk]] [15:32:01.093] NAME <- NAMES[[kk]] [15:32:01.093] if (name != NAME && is.element(NAME, old_names)) [15:32:01.093] next [15:32:01.093] args[[name]] <- "" [15:32:01.093] } [15:32:01.093] NAMES <- toupper(removed) [15:32:01.093] for (kk in seq_along(NAMES)) { [15:32:01.093] name <- removed[[kk]] [15:32:01.093] NAME <- NAMES[[kk]] [15:32:01.093] if (name != NAME && is.element(NAME, old_names)) [15:32:01.093] next [15:32:01.093] args[[name]] <- ...future.oldEnvVars[[name]] [15:32:01.093] } [15:32:01.093] if (length(args) > 0) [15:32:01.093] base::do.call(base::Sys.setenv, args = args) [15:32:01.093] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:32:01.093] } [15:32:01.093] else { [15:32:01.093] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:32:01.093] } [15:32:01.093] { [15:32:01.093] if (base::length(...future.futureOptionsAdded) > [15:32:01.093] 0L) { [15:32:01.093] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:32:01.093] base::names(opts) <- ...future.futureOptionsAdded [15:32:01.093] base::options(opts) [15:32:01.093] } [15:32:01.093] { [15:32:01.093] { [15:32:01.093] base::options(mc.cores = ...future.mc.cores.old) [15:32:01.093] NULL [15:32:01.093] } [15:32:01.093] options(future.plan = NULL) [15:32:01.093] if (is.na(NA_character_)) [15:32:01.093] Sys.unsetenv("R_FUTURE_PLAN") [15:32:01.093] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:32:01.093] future::plan(...future.strategy.old, .cleanup = FALSE, [15:32:01.093] .init = FALSE) [15:32:01.093] } [15:32:01.093] } [15:32:01.093] } [15:32:01.093] }) [15:32:01.093] if (TRUE) { [15:32:01.093] base::sink(type = "output", split = FALSE) [15:32:01.093] if (TRUE) { [15:32:01.093] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:32:01.093] } [15:32:01.093] else { [15:32:01.093] ...future.result["stdout"] <- base::list(NULL) [15:32:01.093] } [15:32:01.093] base::close(...future.stdout) [15:32:01.093] ...future.stdout <- NULL [15:32:01.093] } [15:32:01.093] ...future.result$conditions <- ...future.conditions [15:32:01.093] ...future.result$finished <- base::Sys.time() [15:32:01.093] ...future.result [15:32:01.093] } [15:32:01.102] Exporting 5 global objects (345.92 KiB) to cluster node #1 ... [15:32:01.102] Exporting '...future.FUN' (345.92 KiB) to cluster node #1 ... [15:32:01.104] Exporting '...future.FUN' (345.92 KiB) to cluster node #1 ... DONE [15:32:01.104] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [15:32:01.105] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [15:32:01.106] Exporting '...future.elements_ii' (64 bytes) to cluster node #1 ... [15:32:01.106] Exporting '...future.elements_ii' (64 bytes) to cluster node #1 ... DONE [15:32:01.107] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:32:01.108] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:32:01.108] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:32:01.109] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:32:01.109] Exporting 5 global objects (345.92 KiB) to cluster node #1 ... DONE [15:32:01.110] MultisessionFuture started [15:32:01.110] - Launch lazy future ... done [15:32:01.110] run() for 'MultisessionFuture' ... done [15:32:01.111] Created future: [15:32:01.138] receiveMessageFromWorker() for ClusterFuture ... [15:32:01.138] - Validating connection of MultisessionFuture [15:32:01.139] - received message: FutureResult [15:32:01.139] - Received FutureResult [15:32:01.139] - Erased future from FutureRegistry [15:32:01.140] result() for ClusterFuture ... [15:32:01.140] - result already collected: FutureResult [15:32:01.140] result() for ClusterFuture ... done [15:32:01.141] receiveMessageFromWorker() for ClusterFuture ... done [15:32:01.111] MultisessionFuture: [15:32:01.111] Label: 'future_lapply-1' [15:32:01.111] Expression: [15:32:01.111] { [15:32:01.111] do.call(function(...) { [15:32:01.111] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:01.111] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:32:01.111] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:01.111] on.exit(options(oopts), add = TRUE) [15:32:01.111] } [15:32:01.111] { [15:32:01.111] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:32:01.111] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:01.111] ...future.FUN(...future.X_jj, ...) [15:32:01.111] }) [15:32:01.111] } [15:32:01.111] }, args = future.call.arguments) [15:32:01.111] } [15:32:01.111] Lazy evaluation: FALSE [15:32:01.111] Asynchronous evaluation: TRUE [15:32:01.111] Local evaluation: TRUE [15:32:01.111] Environment: R_GlobalEnv [15:32:01.111] Capture standard output: TRUE [15:32:01.111] Capture condition classes: 'condition' (excluding 'nothing') [15:32:01.111] Globals: 5 objects totaling 345.98 KiB (function '...future.FUN' of 345.92 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 64 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:32:01.111] Packages: [15:32:01.111] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:32:01.111] Resolved: TRUE [15:32:01.111] Value: [15:32:01.111] Conditions captured: [15:32:01.111] Early signaling: FALSE [15:32:01.111] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:32:01.111] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:32:01.141] Chunk #1 of 2 ... DONE [15:32:01.142] Chunk #2 of 2 ... [15:32:01.142] - Finding globals in 'X' for chunk #2 ... [15:32:01.142] getGlobalsAndPackages() ... [15:32:01.142] Searching for globals... [15:32:01.143] [15:32:01.143] Searching for globals ... DONE [15:32:01.143] - globals: [0] [15:32:01.143] getGlobalsAndPackages() ... DONE [15:32:01.143] + additional globals found: [n=0] [15:32:01.144] + additional namespaces needed: [n=0] [15:32:01.144] - Finding globals in 'X' for chunk #2 ... DONE [15:32:01.144] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:32:01.144] - seeds: [15:32:01.144] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:01.144] getGlobalsAndPackages() ... [15:32:01.145] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:01.145] Resolving globals: FALSE [15:32:01.145] Tweak future expression to call with '...' arguments ... [15:32:01.146] { [15:32:01.146] do.call(function(...) { [15:32:01.146] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:01.146] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:32:01.146] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:01.146] on.exit(options(oopts), add = TRUE) [15:32:01.146] } [15:32:01.146] { [15:32:01.146] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:32:01.146] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:01.146] ...future.FUN(...future.X_jj, ...) [15:32:01.146] }) [15:32:01.146] } [15:32:01.146] }, args = future.call.arguments) [15:32:01.146] } [15:32:01.146] Tweak future expression to call with '...' arguments ... DONE [15:32:01.147] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:01.147] [15:32:01.147] getGlobalsAndPackages() ... DONE [15:32:01.148] run() for 'Future' ... [15:32:01.148] - state: 'created' [15:32:01.148] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:32:01.165] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:32:01.166] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:32:01.166] - Field: 'node' [15:32:01.166] - Field: 'label' [15:32:01.166] - Field: 'local' [15:32:01.166] - Field: 'owner' [15:32:01.167] - Field: 'envir' [15:32:01.167] - Field: 'workers' [15:32:01.167] - Field: 'packages' [15:32:01.167] - Field: 'gc' [15:32:01.167] - Field: 'conditions' [15:32:01.167] - Field: 'persistent' [15:32:01.168] - Field: 'expr' [15:32:01.168] - Field: 'uuid' [15:32:01.168] - Field: 'seed' [15:32:01.168] - Field: 'version' [15:32:01.168] - Field: 'result' [15:32:01.169] - Field: 'asynchronous' [15:32:01.169] - Field: 'calls' [15:32:01.169] - Field: 'globals' [15:32:01.173] - Field: 'stdout' [15:32:01.173] - Field: 'earlySignal' [15:32:01.173] - Field: 'lazy' [15:32:01.173] - Field: 'state' [15:32:01.174] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:32:01.174] - Launch lazy future ... [15:32:01.175] Packages needed by the future expression (n = 0): [15:32:01.175] Packages needed by future strategies (n = 0): [15:32:01.176] { [15:32:01.176] { [15:32:01.176] { [15:32:01.176] ...future.startTime <- base::Sys.time() [15:32:01.176] { [15:32:01.176] { [15:32:01.176] { [15:32:01.176] { [15:32:01.176] base::local({ [15:32:01.176] has_future <- base::requireNamespace("future", [15:32:01.176] quietly = TRUE) [15:32:01.176] if (has_future) { [15:32:01.176] ns <- base::getNamespace("future") [15:32:01.176] version <- ns[[".package"]][["version"]] [15:32:01.176] if (is.null(version)) [15:32:01.176] version <- utils::packageVersion("future") [15:32:01.176] } [15:32:01.176] else { [15:32:01.176] version <- NULL [15:32:01.176] } [15:32:01.176] if (!has_future || version < "1.8.0") { [15:32:01.176] info <- base::c(r_version = base::gsub("R version ", [15:32:01.176] "", base::R.version$version.string), [15:32:01.176] platform = base::sprintf("%s (%s-bit)", [15:32:01.176] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:32:01.176] os = base::paste(base::Sys.info()[base::c("sysname", [15:32:01.176] "release", "version")], collapse = " "), [15:32:01.176] hostname = base::Sys.info()[["nodename"]]) [15:32:01.176] info <- base::sprintf("%s: %s", base::names(info), [15:32:01.176] info) [15:32:01.176] info <- base::paste(info, collapse = "; ") [15:32:01.176] if (!has_future) { [15:32:01.176] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:32:01.176] info) [15:32:01.176] } [15:32:01.176] else { [15:32:01.176] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:32:01.176] info, version) [15:32:01.176] } [15:32:01.176] base::stop(msg) [15:32:01.176] } [15:32:01.176] }) [15:32:01.176] } [15:32:01.176] ...future.mc.cores.old <- base::getOption("mc.cores") [15:32:01.176] base::options(mc.cores = 1L) [15:32:01.176] } [15:32:01.176] ...future.strategy.old <- future::plan("list") [15:32:01.176] options(future.plan = NULL) [15:32:01.176] Sys.unsetenv("R_FUTURE_PLAN") [15:32:01.176] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:32:01.176] } [15:32:01.176] ...future.workdir <- getwd() [15:32:01.176] } [15:32:01.176] ...future.oldOptions <- base::as.list(base::.Options) [15:32:01.176] ...future.oldEnvVars <- base::Sys.getenv() [15:32:01.176] } [15:32:01.176] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:32:01.176] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:32:01.176] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:32:01.176] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:32:01.176] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:32:01.176] future.stdout.windows.reencode = NULL, width = 80L) [15:32:01.176] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:32:01.176] base::names(...future.oldOptions)) [15:32:01.176] } [15:32:01.176] if (FALSE) { [15:32:01.176] } [15:32:01.176] else { [15:32:01.176] if (TRUE) { [15:32:01.176] ...future.stdout <- base::rawConnection(base::raw(0L), [15:32:01.176] open = "w") [15:32:01.176] } [15:32:01.176] else { [15:32:01.176] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:32:01.176] windows = "NUL", "/dev/null"), open = "w") [15:32:01.176] } [15:32:01.176] base::sink(...future.stdout, type = "output", split = FALSE) [15:32:01.176] base::on.exit(if (!base::is.null(...future.stdout)) { [15:32:01.176] base::sink(type = "output", split = FALSE) [15:32:01.176] base::close(...future.stdout) [15:32:01.176] }, add = TRUE) [15:32:01.176] } [15:32:01.176] ...future.frame <- base::sys.nframe() [15:32:01.176] ...future.conditions <- base::list() [15:32:01.176] ...future.rng <- base::globalenv()$.Random.seed [15:32:01.176] if (FALSE) { [15:32:01.176] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:32:01.176] "...future.value", "...future.globalenv.names", ".Random.seed") [15:32:01.176] } [15:32:01.176] ...future.result <- base::tryCatch({ [15:32:01.176] base::withCallingHandlers({ [15:32:01.176] ...future.value <- base::withVisible(base::local({ [15:32:01.176] ...future.makeSendCondition <- base::local({ [15:32:01.176] sendCondition <- NULL [15:32:01.176] function(frame = 1L) { [15:32:01.176] if (is.function(sendCondition)) [15:32:01.176] return(sendCondition) [15:32:01.176] ns <- getNamespace("parallel") [15:32:01.176] if (exists("sendData", mode = "function", [15:32:01.176] envir = ns)) { [15:32:01.176] parallel_sendData <- get("sendData", mode = "function", [15:32:01.176] envir = ns) [15:32:01.176] envir <- sys.frame(frame) [15:32:01.176] master <- NULL [15:32:01.176] while (!identical(envir, .GlobalEnv) && [15:32:01.176] !identical(envir, emptyenv())) { [15:32:01.176] if (exists("master", mode = "list", envir = envir, [15:32:01.176] inherits = FALSE)) { [15:32:01.176] master <- get("master", mode = "list", [15:32:01.176] envir = envir, inherits = FALSE) [15:32:01.176] if (inherits(master, c("SOCKnode", [15:32:01.176] "SOCK0node"))) { [15:32:01.176] sendCondition <<- function(cond) { [15:32:01.176] data <- list(type = "VALUE", value = cond, [15:32:01.176] success = TRUE) [15:32:01.176] parallel_sendData(master, data) [15:32:01.176] } [15:32:01.176] return(sendCondition) [15:32:01.176] } [15:32:01.176] } [15:32:01.176] frame <- frame + 1L [15:32:01.176] envir <- sys.frame(frame) [15:32:01.176] } [15:32:01.176] } [15:32:01.176] sendCondition <<- function(cond) NULL [15:32:01.176] } [15:32:01.176] }) [15:32:01.176] withCallingHandlers({ [15:32:01.176] { [15:32:01.176] do.call(function(...) { [15:32:01.176] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:01.176] if (!identical(...future.globals.maxSize.org, [15:32:01.176] ...future.globals.maxSize)) { [15:32:01.176] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:01.176] on.exit(options(oopts), add = TRUE) [15:32:01.176] } [15:32:01.176] { [15:32:01.176] lapply(seq_along(...future.elements_ii), [15:32:01.176] FUN = function(jj) { [15:32:01.176] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:01.176] ...future.FUN(...future.X_jj, ...) [15:32:01.176] }) [15:32:01.176] } [15:32:01.176] }, args = future.call.arguments) [15:32:01.176] } [15:32:01.176] }, immediateCondition = function(cond) { [15:32:01.176] sendCondition <- ...future.makeSendCondition() [15:32:01.176] sendCondition(cond) [15:32:01.176] muffleCondition <- function (cond, pattern = "^muffle") [15:32:01.176] { [15:32:01.176] inherits <- base::inherits [15:32:01.176] invokeRestart <- base::invokeRestart [15:32:01.176] is.null <- base::is.null [15:32:01.176] muffled <- FALSE [15:32:01.176] if (inherits(cond, "message")) { [15:32:01.176] muffled <- grepl(pattern, "muffleMessage") [15:32:01.176] if (muffled) [15:32:01.176] invokeRestart("muffleMessage") [15:32:01.176] } [15:32:01.176] else if (inherits(cond, "warning")) { [15:32:01.176] muffled <- grepl(pattern, "muffleWarning") [15:32:01.176] if (muffled) [15:32:01.176] invokeRestart("muffleWarning") [15:32:01.176] } [15:32:01.176] else if (inherits(cond, "condition")) { [15:32:01.176] if (!is.null(pattern)) { [15:32:01.176] computeRestarts <- base::computeRestarts [15:32:01.176] grepl <- base::grepl [15:32:01.176] restarts <- computeRestarts(cond) [15:32:01.176] for (restart in restarts) { [15:32:01.176] name <- restart$name [15:32:01.176] if (is.null(name)) [15:32:01.176] next [15:32:01.176] if (!grepl(pattern, name)) [15:32:01.176] next [15:32:01.176] invokeRestart(restart) [15:32:01.176] muffled <- TRUE [15:32:01.176] break [15:32:01.176] } [15:32:01.176] } [15:32:01.176] } [15:32:01.176] invisible(muffled) [15:32:01.176] } [15:32:01.176] muffleCondition(cond) [15:32:01.176] }) [15:32:01.176] })) [15:32:01.176] future::FutureResult(value = ...future.value$value, [15:32:01.176] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:32:01.176] ...future.rng), globalenv = if (FALSE) [15:32:01.176] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:32:01.176] ...future.globalenv.names)) [15:32:01.176] else NULL, started = ...future.startTime, version = "1.8") [15:32:01.176] }, condition = base::local({ [15:32:01.176] c <- base::c [15:32:01.176] inherits <- base::inherits [15:32:01.176] invokeRestart <- base::invokeRestart [15:32:01.176] length <- base::length [15:32:01.176] list <- base::list [15:32:01.176] seq.int <- base::seq.int [15:32:01.176] signalCondition <- base::signalCondition [15:32:01.176] sys.calls <- base::sys.calls [15:32:01.176] `[[` <- base::`[[` [15:32:01.176] `+` <- base::`+` [15:32:01.176] `<<-` <- base::`<<-` [15:32:01.176] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:32:01.176] calls[seq.int(from = from + 12L, to = length(calls) - [15:32:01.176] 3L)] [15:32:01.176] } [15:32:01.176] function(cond) { [15:32:01.176] is_error <- inherits(cond, "error") [15:32:01.176] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:32:01.176] NULL) [15:32:01.176] if (is_error) { [15:32:01.176] sessionInformation <- function() { [15:32:01.176] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:32:01.176] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:32:01.176] search = base::search(), system = base::Sys.info()) [15:32:01.176] } [15:32:01.176] ...future.conditions[[length(...future.conditions) + [15:32:01.176] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:32:01.176] cond$call), session = sessionInformation(), [15:32:01.176] timestamp = base::Sys.time(), signaled = 0L) [15:32:01.176] signalCondition(cond) [15:32:01.176] } [15:32:01.176] else if (!ignore && TRUE && inherits(cond, c("condition", [15:32:01.176] "immediateCondition"))) { [15:32:01.176] signal <- TRUE && inherits(cond, "immediateCondition") [15:32:01.176] ...future.conditions[[length(...future.conditions) + [15:32:01.176] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:32:01.176] if (TRUE && !signal) { [15:32:01.176] muffleCondition <- function (cond, pattern = "^muffle") [15:32:01.176] { [15:32:01.176] inherits <- base::inherits [15:32:01.176] invokeRestart <- base::invokeRestart [15:32:01.176] is.null <- base::is.null [15:32:01.176] muffled <- FALSE [15:32:01.176] if (inherits(cond, "message")) { [15:32:01.176] muffled <- grepl(pattern, "muffleMessage") [15:32:01.176] if (muffled) [15:32:01.176] invokeRestart("muffleMessage") [15:32:01.176] } [15:32:01.176] else if (inherits(cond, "warning")) { [15:32:01.176] muffled <- grepl(pattern, "muffleWarning") [15:32:01.176] if (muffled) [15:32:01.176] invokeRestart("muffleWarning") [15:32:01.176] } [15:32:01.176] else if (inherits(cond, "condition")) { [15:32:01.176] if (!is.null(pattern)) { [15:32:01.176] computeRestarts <- base::computeRestarts [15:32:01.176] grepl <- base::grepl [15:32:01.176] restarts <- computeRestarts(cond) [15:32:01.176] for (restart in restarts) { [15:32:01.176] name <- restart$name [15:32:01.176] if (is.null(name)) [15:32:01.176] next [15:32:01.176] if (!grepl(pattern, name)) [15:32:01.176] next [15:32:01.176] invokeRestart(restart) [15:32:01.176] muffled <- TRUE [15:32:01.176] break [15:32:01.176] } [15:32:01.176] } [15:32:01.176] } [15:32:01.176] invisible(muffled) [15:32:01.176] } [15:32:01.176] muffleCondition(cond, pattern = "^muffle") [15:32:01.176] } [15:32:01.176] } [15:32:01.176] else { [15:32:01.176] if (TRUE) { [15:32:01.176] muffleCondition <- function (cond, pattern = "^muffle") [15:32:01.176] { [15:32:01.176] inherits <- base::inherits [15:32:01.176] invokeRestart <- base::invokeRestart [15:32:01.176] is.null <- base::is.null [15:32:01.176] muffled <- FALSE [15:32:01.176] if (inherits(cond, "message")) { [15:32:01.176] muffled <- grepl(pattern, "muffleMessage") [15:32:01.176] if (muffled) [15:32:01.176] invokeRestart("muffleMessage") [15:32:01.176] } [15:32:01.176] else if (inherits(cond, "warning")) { [15:32:01.176] muffled <- grepl(pattern, "muffleWarning") [15:32:01.176] if (muffled) [15:32:01.176] invokeRestart("muffleWarning") [15:32:01.176] } [15:32:01.176] else if (inherits(cond, "condition")) { [15:32:01.176] if (!is.null(pattern)) { [15:32:01.176] computeRestarts <- base::computeRestarts [15:32:01.176] grepl <- base::grepl [15:32:01.176] restarts <- computeRestarts(cond) [15:32:01.176] for (restart in restarts) { [15:32:01.176] name <- restart$name [15:32:01.176] if (is.null(name)) [15:32:01.176] next [15:32:01.176] if (!grepl(pattern, name)) [15:32:01.176] next [15:32:01.176] invokeRestart(restart) [15:32:01.176] muffled <- TRUE [15:32:01.176] break [15:32:01.176] } [15:32:01.176] } [15:32:01.176] } [15:32:01.176] invisible(muffled) [15:32:01.176] } [15:32:01.176] muffleCondition(cond, pattern = "^muffle") [15:32:01.176] } [15:32:01.176] } [15:32:01.176] } [15:32:01.176] })) [15:32:01.176] }, error = function(ex) { [15:32:01.176] base::structure(base::list(value = NULL, visible = NULL, [15:32:01.176] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:32:01.176] ...future.rng), started = ...future.startTime, [15:32:01.176] finished = Sys.time(), session_uuid = NA_character_, [15:32:01.176] version = "1.8"), class = "FutureResult") [15:32:01.176] }, finally = { [15:32:01.176] if (!identical(...future.workdir, getwd())) [15:32:01.176] setwd(...future.workdir) [15:32:01.176] { [15:32:01.176] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:32:01.176] ...future.oldOptions$nwarnings <- NULL [15:32:01.176] } [15:32:01.176] base::options(...future.oldOptions) [15:32:01.176] if (.Platform$OS.type == "windows") { [15:32:01.176] old_names <- names(...future.oldEnvVars) [15:32:01.176] envs <- base::Sys.getenv() [15:32:01.176] names <- names(envs) [15:32:01.176] common <- intersect(names, old_names) [15:32:01.176] added <- setdiff(names, old_names) [15:32:01.176] removed <- setdiff(old_names, names) [15:32:01.176] changed <- common[...future.oldEnvVars[common] != [15:32:01.176] envs[common]] [15:32:01.176] NAMES <- toupper(changed) [15:32:01.176] args <- list() [15:32:01.176] for (kk in seq_along(NAMES)) { [15:32:01.176] name <- changed[[kk]] [15:32:01.176] NAME <- NAMES[[kk]] [15:32:01.176] if (name != NAME && is.element(NAME, old_names)) [15:32:01.176] next [15:32:01.176] args[[name]] <- ...future.oldEnvVars[[name]] [15:32:01.176] } [15:32:01.176] NAMES <- toupper(added) [15:32:01.176] for (kk in seq_along(NAMES)) { [15:32:01.176] name <- added[[kk]] [15:32:01.176] NAME <- NAMES[[kk]] [15:32:01.176] if (name != NAME && is.element(NAME, old_names)) [15:32:01.176] next [15:32:01.176] args[[name]] <- "" [15:32:01.176] } [15:32:01.176] NAMES <- toupper(removed) [15:32:01.176] for (kk in seq_along(NAMES)) { [15:32:01.176] name <- removed[[kk]] [15:32:01.176] NAME <- NAMES[[kk]] [15:32:01.176] if (name != NAME && is.element(NAME, old_names)) [15:32:01.176] next [15:32:01.176] args[[name]] <- ...future.oldEnvVars[[name]] [15:32:01.176] } [15:32:01.176] if (length(args) > 0) [15:32:01.176] base::do.call(base::Sys.setenv, args = args) [15:32:01.176] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:32:01.176] } [15:32:01.176] else { [15:32:01.176] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:32:01.176] } [15:32:01.176] { [15:32:01.176] if (base::length(...future.futureOptionsAdded) > [15:32:01.176] 0L) { [15:32:01.176] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:32:01.176] base::names(opts) <- ...future.futureOptionsAdded [15:32:01.176] base::options(opts) [15:32:01.176] } [15:32:01.176] { [15:32:01.176] { [15:32:01.176] base::options(mc.cores = ...future.mc.cores.old) [15:32:01.176] NULL [15:32:01.176] } [15:32:01.176] options(future.plan = NULL) [15:32:01.176] if (is.na(NA_character_)) [15:32:01.176] Sys.unsetenv("R_FUTURE_PLAN") [15:32:01.176] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:32:01.176] future::plan(...future.strategy.old, .cleanup = FALSE, [15:32:01.176] .init = FALSE) [15:32:01.176] } [15:32:01.176] } [15:32:01.176] } [15:32:01.176] }) [15:32:01.176] if (TRUE) { [15:32:01.176] base::sink(type = "output", split = FALSE) [15:32:01.176] if (TRUE) { [15:32:01.176] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:32:01.176] } [15:32:01.176] else { [15:32:01.176] ...future.result["stdout"] <- base::list(NULL) [15:32:01.176] } [15:32:01.176] base::close(...future.stdout) [15:32:01.176] ...future.stdout <- NULL [15:32:01.176] } [15:32:01.176] ...future.result$conditions <- ...future.conditions [15:32:01.176] ...future.result$finished <- base::Sys.time() [15:32:01.176] ...future.result [15:32:01.176] } [15:32:01.184] Exporting 5 global objects (345.92 KiB) to cluster node #1 ... [15:32:01.184] Exporting '...future.FUN' (345.92 KiB) to cluster node #1 ... [15:32:01.185] Exporting '...future.FUN' (345.92 KiB) to cluster node #1 ... DONE [15:32:01.186] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [15:32:01.187] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [15:32:01.188] Exporting '...future.elements_ii' (64 bytes) to cluster node #1 ... [15:32:01.189] Exporting '...future.elements_ii' (64 bytes) to cluster node #1 ... DONE [15:32:01.190] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:32:01.191] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:32:01.191] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:32:01.192] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:32:01.192] Exporting 5 global objects (345.92 KiB) to cluster node #1 ... DONE [15:32:01.193] MultisessionFuture started [15:32:01.194] - Launch lazy future ... done [15:32:01.194] run() for 'MultisessionFuture' ... done [15:32:01.194] Created future: [15:32:01.218] receiveMessageFromWorker() for ClusterFuture ... [15:32:01.219] - Validating connection of MultisessionFuture [15:32:01.219] - received message: FutureResult [15:32:01.220] - Received FutureResult [15:32:01.220] - Erased future from FutureRegistry [15:32:01.220] result() for ClusterFuture ... [15:32:01.220] - result already collected: FutureResult [15:32:01.221] result() for ClusterFuture ... done [15:32:01.221] receiveMessageFromWorker() for ClusterFuture ... done [15:32:01.195] MultisessionFuture: [15:32:01.195] Label: 'future_lapply-2' [15:32:01.195] Expression: [15:32:01.195] { [15:32:01.195] do.call(function(...) { [15:32:01.195] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:01.195] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:32:01.195] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:01.195] on.exit(options(oopts), add = TRUE) [15:32:01.195] } [15:32:01.195] { [15:32:01.195] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:32:01.195] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:01.195] ...future.FUN(...future.X_jj, ...) [15:32:01.195] }) [15:32:01.195] } [15:32:01.195] }, args = future.call.arguments) [15:32:01.195] } [15:32:01.195] Lazy evaluation: FALSE [15:32:01.195] Asynchronous evaluation: TRUE [15:32:01.195] Local evaluation: TRUE [15:32:01.195] Environment: R_GlobalEnv [15:32:01.195] Capture standard output: TRUE [15:32:01.195] Capture condition classes: 'condition' (excluding 'nothing') [15:32:01.195] Globals: 5 objects totaling 345.98 KiB (function '...future.FUN' of 345.92 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 64 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:32:01.195] Packages: [15:32:01.195] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:32:01.195] Resolved: TRUE [15:32:01.195] Value: [15:32:01.195] Conditions captured: [15:32:01.195] Early signaling: FALSE [15:32:01.195] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:32:01.195] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:32:01.222] Chunk #2 of 2 ... DONE [15:32:01.222] Launching 2 futures (chunks) ... DONE [15:32:01.222] Resolving 2 futures (chunks) ... [15:32:01.223] resolve() on list ... [15:32:01.223] recursive: 0 [15:32:01.223] length: 2 [15:32:01.223] [15:32:01.224] Future #1 [15:32:01.224] result() for ClusterFuture ... [15:32:01.224] - result already collected: FutureResult [15:32:01.225] result() for ClusterFuture ... done [15:32:01.225] result() for ClusterFuture ... [15:32:01.225] - result already collected: FutureResult [15:32:01.225] result() for ClusterFuture ... done [15:32:01.226] signalConditionsASAP(MultisessionFuture, pos=1) ... [15:32:01.226] - nx: 2 [15:32:01.226] - relay: TRUE [15:32:01.227] - stdout: TRUE [15:32:01.227] - signal: TRUE [15:32:01.227] - resignal: FALSE [15:32:01.227] - force: TRUE [15:32:01.227] - relayed: [n=2] FALSE, FALSE [15:32:01.228] - queued futures: [n=2] FALSE, FALSE [15:32:01.228] - until=1 [15:32:01.228] - relaying element #1 [15:32:01.229] result() for ClusterFuture ... [15:32:01.229] - result already collected: FutureResult [15:32:01.229] result() for ClusterFuture ... done [15:32:01.229] result() for ClusterFuture ... [15:32:01.230] - result already collected: FutureResult [15:32:01.230] result() for ClusterFuture ... done [15:32:01.230] result() for ClusterFuture ... [15:32:01.230] - result already collected: FutureResult [15:32:01.231] result() for ClusterFuture ... done [15:32:01.231] result() for ClusterFuture ... [15:32:01.231] - result already collected: FutureResult [15:32:01.232] result() for ClusterFuture ... done [15:32:01.232] - relayed: [n=2] TRUE, FALSE [15:32:01.232] - queued futures: [n=2] TRUE, FALSE [15:32:01.232] signalConditionsASAP(MultisessionFuture, pos=1) ... done [15:32:01.233] length: 1 (resolved future 1) [15:32:01.233] Future #2 [15:32:01.233] result() for ClusterFuture ... [15:32:01.234] - result already collected: FutureResult [15:32:01.234] result() for ClusterFuture ... done [15:32:01.234] result() for ClusterFuture ... [15:32:01.234] - result already collected: FutureResult [15:32:01.235] result() for ClusterFuture ... done [15:32:01.235] signalConditionsASAP(MultisessionFuture, pos=2) ... [15:32:01.235] - nx: 2 [15:32:01.235] - relay: TRUE [15:32:01.236] - stdout: TRUE [15:32:01.236] - signal: TRUE [15:32:01.236] - resignal: FALSE [15:32:01.236] - force: TRUE [15:32:01.237] - relayed: [n=2] TRUE, FALSE [15:32:01.237] - queued futures: [n=2] TRUE, FALSE [15:32:01.237] - until=2 [15:32:01.238] - relaying element #2 [15:32:01.238] result() for ClusterFuture ... [15:32:01.238] - result already collected: FutureResult [15:32:01.238] result() for ClusterFuture ... done [15:32:01.239] result() for ClusterFuture ... [15:32:01.239] - result already collected: FutureResult [15:32:01.239] result() for ClusterFuture ... done [15:32:01.239] result() for ClusterFuture ... [15:32:01.240] - result already collected: FutureResult [15:32:01.240] result() for ClusterFuture ... done [15:32:01.240] result() for ClusterFuture ... [15:32:01.240] - result already collected: FutureResult [15:32:01.241] result() for ClusterFuture ... done [15:32:01.241] - relayed: [n=2] TRUE, TRUE [15:32:01.241] - queued futures: [n=2] TRUE, TRUE [15:32:01.242] signalConditionsASAP(MultisessionFuture, pos=2) ... done [15:32:01.242] length: 0 (resolved future 2) [15:32:01.242] Relaying remaining futures [15:32:01.242] signalConditionsASAP(NULL, pos=0) ... [15:32:01.243] - nx: 2 [15:32:01.243] - relay: TRUE [15:32:01.243] - stdout: TRUE [15:32:01.243] - signal: TRUE [15:32:01.244] - resignal: FALSE [15:32:01.244] - force: TRUE [15:32:01.244] - relayed: [n=2] TRUE, TRUE [15:32:01.244] - queued futures: [n=2] TRUE, TRUE - flush all [15:32:01.245] - relayed: [n=2] TRUE, TRUE [15:32:01.245] - queued futures: [n=2] TRUE, TRUE [15:32:01.245] signalConditionsASAP(NULL, pos=0) ... done [15:32:01.246] resolve() on list ... DONE [15:32:01.246] result() for ClusterFuture ... [15:32:01.246] - result already collected: FutureResult [15:32:01.246] result() for ClusterFuture ... done [15:32:01.247] result() for ClusterFuture ... [15:32:01.247] - result already collected: FutureResult [15:32:01.247] result() for ClusterFuture ... done [15:32:01.248] result() for ClusterFuture ... [15:32:01.248] - result already collected: FutureResult [15:32:01.248] result() for ClusterFuture ... done [15:32:01.248] result() for ClusterFuture ... [15:32:01.249] - result already collected: FutureResult [15:32:01.249] result() for ClusterFuture ... done [15:32:01.249] - Number of value chunks collected: 2 [15:32:01.249] Resolving 2 futures (chunks) ... DONE [15:32:01.250] Reducing values from 2 chunks ... [15:32:01.250] - Number of values collected after concatenation: 2 [15:32:01.250] - Number of values expected: 2 [15:32:01.250] Reducing values from 2 chunks ... DONE [15:32:01.251] future_lapply() ... DONE - future_lapply(x, ...) where length(x) != length(as.list(x)) ... [15:32:01.251] future_lapply() ... [15:32:01.256] Number of chunks: 2 [15:32:01.256] getGlobalsAndPackagesXApply() ... [15:32:01.256] - future.globals: TRUE [15:32:01.256] getGlobalsAndPackages() ... [15:32:01.257] Searching for globals... [15:32:01.258] - globals found: [1] 'FUN' [15:32:01.258] Searching for globals ... DONE [15:32:01.258] Resolving globals: FALSE [15:32:01.259] The total size of the 1 globals is 56 bytes (56 bytes) [15:32:01.260] The total size of the 1 globals exported for future expression ('FUN()') is 56 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (56 bytes of class 'function') [15:32:01.260] - globals: [1] 'FUN' [15:32:01.260] [15:32:01.260] getGlobalsAndPackages() ... DONE [15:32:01.261] - globals found/used: [n=1] 'FUN' [15:32:01.261] - needed namespaces: [n=0] [15:32:01.261] Finding globals ... DONE [15:32:01.262] - use_args: TRUE [15:32:01.262] - Getting '...' globals ... [15:32:01.262] resolve() on list ... [15:32:01.263] recursive: 0 [15:32:01.263] length: 1 [15:32:01.263] elements: '...' [15:32:01.264] length: 0 (resolved future 1) [15:32:01.264] resolve() on list ... DONE [15:32:01.264] - '...' content: [n=0] [15:32:01.264] List of 1 [15:32:01.264] $ ...: list() [15:32:01.264] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:32:01.264] - attr(*, "where")=List of 1 [15:32:01.264] ..$ ...: [15:32:01.264] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:32:01.264] - attr(*, "resolved")= logi TRUE [15:32:01.264] - attr(*, "total_size")= num NA [15:32:01.269] - Getting '...' globals ... DONE [15:32:01.269] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:32:01.270] List of 2 [15:32:01.270] $ ...future.FUN:function (x) [15:32:01.270] $ ... : list() [15:32:01.270] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:32:01.270] - attr(*, "where")=List of 2 [15:32:01.270] ..$ ...future.FUN: [15:32:01.270] ..$ ... : [15:32:01.270] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:32:01.270] - attr(*, "resolved")= logi FALSE [15:32:01.270] - attr(*, "total_size")= num 56 [15:32:01.275] Packages to be attached in all futures: [n=0] [15:32:01.275] getGlobalsAndPackagesXApply() ... DONE [15:32:01.276] Number of futures (= number of chunks): 2 [15:32:01.276] Launching 2 futures (chunks) ... [15:32:01.276] Chunk #1 of 2 ... [15:32:01.277] - Finding globals in 'X' for chunk #1 ... [15:32:01.277] getGlobalsAndPackages() ... [15:32:01.277] Searching for globals... [15:32:01.278] [15:32:01.278] Searching for globals ... DONE [15:32:01.278] - globals: [0] [15:32:01.278] getGlobalsAndPackages() ... DONE [15:32:01.279] + additional globals found: [n=0] [15:32:01.279] + additional namespaces needed: [n=0] [15:32:01.279] - Finding globals in 'X' for chunk #1 ... DONE [15:32:01.279] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:32:01.280] - seeds: [15:32:01.280] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:01.280] getGlobalsAndPackages() ... [15:32:01.280] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:01.281] Resolving globals: FALSE [15:32:01.281] Tweak future expression to call with '...' arguments ... [15:32:01.281] { [15:32:01.281] do.call(function(...) { [15:32:01.281] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:01.281] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:32:01.281] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:01.281] on.exit(options(oopts), add = TRUE) [15:32:01.281] } [15:32:01.281] { [15:32:01.281] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:32:01.281] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:01.281] ...future.FUN(...future.X_jj, ...) [15:32:01.281] }) [15:32:01.281] } [15:32:01.281] }, args = future.call.arguments) [15:32:01.281] } [15:32:01.282] Tweak future expression to call with '...' arguments ... DONE [15:32:01.283] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:01.283] [15:32:01.283] getGlobalsAndPackages() ... DONE [15:32:01.284] run() for 'Future' ... [15:32:01.284] - state: 'created' [15:32:01.285] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:32:01.302] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:32:01.303] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:32:01.303] - Field: 'node' [15:32:01.303] - Field: 'label' [15:32:01.303] - Field: 'local' [15:32:01.304] - Field: 'owner' [15:32:01.304] - Field: 'envir' [15:32:01.304] - Field: 'workers' [15:32:01.305] - Field: 'packages' [15:32:01.305] - Field: 'gc' [15:32:01.305] - Field: 'conditions' [15:32:01.305] - Field: 'persistent' [15:32:01.306] - Field: 'expr' [15:32:01.306] - Field: 'uuid' [15:32:01.306] - Field: 'seed' [15:32:01.307] - Field: 'version' [15:32:01.307] - Field: 'result' [15:32:01.307] - Field: 'asynchronous' [15:32:01.307] - Field: 'calls' [15:32:01.308] - Field: 'globals' [15:32:01.308] - Field: 'stdout' [15:32:01.308] - Field: 'earlySignal' [15:32:01.309] - Field: 'lazy' [15:32:01.309] - Field: 'state' [15:32:01.309] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:32:01.309] - Launch lazy future ... [15:32:01.310] Packages needed by the future expression (n = 0): [15:32:01.310] Packages needed by future strategies (n = 0): [15:32:01.312] { [15:32:01.312] { [15:32:01.312] { [15:32:01.312] ...future.startTime <- base::Sys.time() [15:32:01.312] { [15:32:01.312] { [15:32:01.312] { [15:32:01.312] { [15:32:01.312] base::local({ [15:32:01.312] has_future <- base::requireNamespace("future", [15:32:01.312] quietly = TRUE) [15:32:01.312] if (has_future) { [15:32:01.312] ns <- base::getNamespace("future") [15:32:01.312] version <- ns[[".package"]][["version"]] [15:32:01.312] if (is.null(version)) [15:32:01.312] version <- utils::packageVersion("future") [15:32:01.312] } [15:32:01.312] else { [15:32:01.312] version <- NULL [15:32:01.312] } [15:32:01.312] if (!has_future || version < "1.8.0") { [15:32:01.312] info <- base::c(r_version = base::gsub("R version ", [15:32:01.312] "", base::R.version$version.string), [15:32:01.312] platform = base::sprintf("%s (%s-bit)", [15:32:01.312] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:32:01.312] os = base::paste(base::Sys.info()[base::c("sysname", [15:32:01.312] "release", "version")], collapse = " "), [15:32:01.312] hostname = base::Sys.info()[["nodename"]]) [15:32:01.312] info <- base::sprintf("%s: %s", base::names(info), [15:32:01.312] info) [15:32:01.312] info <- base::paste(info, collapse = "; ") [15:32:01.312] if (!has_future) { [15:32:01.312] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:32:01.312] info) [15:32:01.312] } [15:32:01.312] else { [15:32:01.312] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:32:01.312] info, version) [15:32:01.312] } [15:32:01.312] base::stop(msg) [15:32:01.312] } [15:32:01.312] }) [15:32:01.312] } [15:32:01.312] ...future.mc.cores.old <- base::getOption("mc.cores") [15:32:01.312] base::options(mc.cores = 1L) [15:32:01.312] } [15:32:01.312] ...future.strategy.old <- future::plan("list") [15:32:01.312] options(future.plan = NULL) [15:32:01.312] Sys.unsetenv("R_FUTURE_PLAN") [15:32:01.312] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:32:01.312] } [15:32:01.312] ...future.workdir <- getwd() [15:32:01.312] } [15:32:01.312] ...future.oldOptions <- base::as.list(base::.Options) [15:32:01.312] ...future.oldEnvVars <- base::Sys.getenv() [15:32:01.312] } [15:32:01.312] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:32:01.312] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:32:01.312] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:32:01.312] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:32:01.312] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:32:01.312] future.stdout.windows.reencode = NULL, width = 80L) [15:32:01.312] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:32:01.312] base::names(...future.oldOptions)) [15:32:01.312] } [15:32:01.312] if (FALSE) { [15:32:01.312] } [15:32:01.312] else { [15:32:01.312] if (TRUE) { [15:32:01.312] ...future.stdout <- base::rawConnection(base::raw(0L), [15:32:01.312] open = "w") [15:32:01.312] } [15:32:01.312] else { [15:32:01.312] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:32:01.312] windows = "NUL", "/dev/null"), open = "w") [15:32:01.312] } [15:32:01.312] base::sink(...future.stdout, type = "output", split = FALSE) [15:32:01.312] base::on.exit(if (!base::is.null(...future.stdout)) { [15:32:01.312] base::sink(type = "output", split = FALSE) [15:32:01.312] base::close(...future.stdout) [15:32:01.312] }, add = TRUE) [15:32:01.312] } [15:32:01.312] ...future.frame <- base::sys.nframe() [15:32:01.312] ...future.conditions <- base::list() [15:32:01.312] ...future.rng <- base::globalenv()$.Random.seed [15:32:01.312] if (FALSE) { [15:32:01.312] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:32:01.312] "...future.value", "...future.globalenv.names", ".Random.seed") [15:32:01.312] } [15:32:01.312] ...future.result <- base::tryCatch({ [15:32:01.312] base::withCallingHandlers({ [15:32:01.312] ...future.value <- base::withVisible(base::local({ [15:32:01.312] ...future.makeSendCondition <- base::local({ [15:32:01.312] sendCondition <- NULL [15:32:01.312] function(frame = 1L) { [15:32:01.312] if (is.function(sendCondition)) [15:32:01.312] return(sendCondition) [15:32:01.312] ns <- getNamespace("parallel") [15:32:01.312] if (exists("sendData", mode = "function", [15:32:01.312] envir = ns)) { [15:32:01.312] parallel_sendData <- get("sendData", mode = "function", [15:32:01.312] envir = ns) [15:32:01.312] envir <- sys.frame(frame) [15:32:01.312] master <- NULL [15:32:01.312] while (!identical(envir, .GlobalEnv) && [15:32:01.312] !identical(envir, emptyenv())) { [15:32:01.312] if (exists("master", mode = "list", envir = envir, [15:32:01.312] inherits = FALSE)) { [15:32:01.312] master <- get("master", mode = "list", [15:32:01.312] envir = envir, inherits = FALSE) [15:32:01.312] if (inherits(master, c("SOCKnode", [15:32:01.312] "SOCK0node"))) { [15:32:01.312] sendCondition <<- function(cond) { [15:32:01.312] data <- list(type = "VALUE", value = cond, [15:32:01.312] success = TRUE) [15:32:01.312] parallel_sendData(master, data) [15:32:01.312] } [15:32:01.312] return(sendCondition) [15:32:01.312] } [15:32:01.312] } [15:32:01.312] frame <- frame + 1L [15:32:01.312] envir <- sys.frame(frame) [15:32:01.312] } [15:32:01.312] } [15:32:01.312] sendCondition <<- function(cond) NULL [15:32:01.312] } [15:32:01.312] }) [15:32:01.312] withCallingHandlers({ [15:32:01.312] { [15:32:01.312] do.call(function(...) { [15:32:01.312] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:01.312] if (!identical(...future.globals.maxSize.org, [15:32:01.312] ...future.globals.maxSize)) { [15:32:01.312] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:01.312] on.exit(options(oopts), add = TRUE) [15:32:01.312] } [15:32:01.312] { [15:32:01.312] lapply(seq_along(...future.elements_ii), [15:32:01.312] FUN = function(jj) { [15:32:01.312] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:01.312] ...future.FUN(...future.X_jj, ...) [15:32:01.312] }) [15:32:01.312] } [15:32:01.312] }, args = future.call.arguments) [15:32:01.312] } [15:32:01.312] }, immediateCondition = function(cond) { [15:32:01.312] sendCondition <- ...future.makeSendCondition() [15:32:01.312] sendCondition(cond) [15:32:01.312] muffleCondition <- function (cond, pattern = "^muffle") [15:32:01.312] { [15:32:01.312] inherits <- base::inherits [15:32:01.312] invokeRestart <- base::invokeRestart [15:32:01.312] is.null <- base::is.null [15:32:01.312] muffled <- FALSE [15:32:01.312] if (inherits(cond, "message")) { [15:32:01.312] muffled <- grepl(pattern, "muffleMessage") [15:32:01.312] if (muffled) [15:32:01.312] invokeRestart("muffleMessage") [15:32:01.312] } [15:32:01.312] else if (inherits(cond, "warning")) { [15:32:01.312] muffled <- grepl(pattern, "muffleWarning") [15:32:01.312] if (muffled) [15:32:01.312] invokeRestart("muffleWarning") [15:32:01.312] } [15:32:01.312] else if (inherits(cond, "condition")) { [15:32:01.312] if (!is.null(pattern)) { [15:32:01.312] computeRestarts <- base::computeRestarts [15:32:01.312] grepl <- base::grepl [15:32:01.312] restarts <- computeRestarts(cond) [15:32:01.312] for (restart in restarts) { [15:32:01.312] name <- restart$name [15:32:01.312] if (is.null(name)) [15:32:01.312] next [15:32:01.312] if (!grepl(pattern, name)) [15:32:01.312] next [15:32:01.312] invokeRestart(restart) [15:32:01.312] muffled <- TRUE [15:32:01.312] break [15:32:01.312] } [15:32:01.312] } [15:32:01.312] } [15:32:01.312] invisible(muffled) [15:32:01.312] } [15:32:01.312] muffleCondition(cond) [15:32:01.312] }) [15:32:01.312] })) [15:32:01.312] future::FutureResult(value = ...future.value$value, [15:32:01.312] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:32:01.312] ...future.rng), globalenv = if (FALSE) [15:32:01.312] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:32:01.312] ...future.globalenv.names)) [15:32:01.312] else NULL, started = ...future.startTime, version = "1.8") [15:32:01.312] }, condition = base::local({ [15:32:01.312] c <- base::c [15:32:01.312] inherits <- base::inherits [15:32:01.312] invokeRestart <- base::invokeRestart [15:32:01.312] length <- base::length [15:32:01.312] list <- base::list [15:32:01.312] seq.int <- base::seq.int [15:32:01.312] signalCondition <- base::signalCondition [15:32:01.312] sys.calls <- base::sys.calls [15:32:01.312] `[[` <- base::`[[` [15:32:01.312] `+` <- base::`+` [15:32:01.312] `<<-` <- base::`<<-` [15:32:01.312] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:32:01.312] calls[seq.int(from = from + 12L, to = length(calls) - [15:32:01.312] 3L)] [15:32:01.312] } [15:32:01.312] function(cond) { [15:32:01.312] is_error <- inherits(cond, "error") [15:32:01.312] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:32:01.312] NULL) [15:32:01.312] if (is_error) { [15:32:01.312] sessionInformation <- function() { [15:32:01.312] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:32:01.312] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:32:01.312] search = base::search(), system = base::Sys.info()) [15:32:01.312] } [15:32:01.312] ...future.conditions[[length(...future.conditions) + [15:32:01.312] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:32:01.312] cond$call), session = sessionInformation(), [15:32:01.312] timestamp = base::Sys.time(), signaled = 0L) [15:32:01.312] signalCondition(cond) [15:32:01.312] } [15:32:01.312] else if (!ignore && TRUE && inherits(cond, c("condition", [15:32:01.312] "immediateCondition"))) { [15:32:01.312] signal <- TRUE && inherits(cond, "immediateCondition") [15:32:01.312] ...future.conditions[[length(...future.conditions) + [15:32:01.312] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:32:01.312] if (TRUE && !signal) { [15:32:01.312] muffleCondition <- function (cond, pattern = "^muffle") [15:32:01.312] { [15:32:01.312] inherits <- base::inherits [15:32:01.312] invokeRestart <- base::invokeRestart [15:32:01.312] is.null <- base::is.null [15:32:01.312] muffled <- FALSE [15:32:01.312] if (inherits(cond, "message")) { [15:32:01.312] muffled <- grepl(pattern, "muffleMessage") [15:32:01.312] if (muffled) [15:32:01.312] invokeRestart("muffleMessage") [15:32:01.312] } [15:32:01.312] else if (inherits(cond, "warning")) { [15:32:01.312] muffled <- grepl(pattern, "muffleWarning") [15:32:01.312] if (muffled) [15:32:01.312] invokeRestart("muffleWarning") [15:32:01.312] } [15:32:01.312] else if (inherits(cond, "condition")) { [15:32:01.312] if (!is.null(pattern)) { [15:32:01.312] computeRestarts <- base::computeRestarts [15:32:01.312] grepl <- base::grepl [15:32:01.312] restarts <- computeRestarts(cond) [15:32:01.312] for (restart in restarts) { [15:32:01.312] name <- restart$name [15:32:01.312] if (is.null(name)) [15:32:01.312] next [15:32:01.312] if (!grepl(pattern, name)) [15:32:01.312] next [15:32:01.312] invokeRestart(restart) [15:32:01.312] muffled <- TRUE [15:32:01.312] break [15:32:01.312] } [15:32:01.312] } [15:32:01.312] } [15:32:01.312] invisible(muffled) [15:32:01.312] } [15:32:01.312] muffleCondition(cond, pattern = "^muffle") [15:32:01.312] } [15:32:01.312] } [15:32:01.312] else { [15:32:01.312] if (TRUE) { [15:32:01.312] muffleCondition <- function (cond, pattern = "^muffle") [15:32:01.312] { [15:32:01.312] inherits <- base::inherits [15:32:01.312] invokeRestart <- base::invokeRestart [15:32:01.312] is.null <- base::is.null [15:32:01.312] muffled <- FALSE [15:32:01.312] if (inherits(cond, "message")) { [15:32:01.312] muffled <- grepl(pattern, "muffleMessage") [15:32:01.312] if (muffled) [15:32:01.312] invokeRestart("muffleMessage") [15:32:01.312] } [15:32:01.312] else if (inherits(cond, "warning")) { [15:32:01.312] muffled <- grepl(pattern, "muffleWarning") [15:32:01.312] if (muffled) [15:32:01.312] invokeRestart("muffleWarning") [15:32:01.312] } [15:32:01.312] else if (inherits(cond, "condition")) { [15:32:01.312] if (!is.null(pattern)) { [15:32:01.312] computeRestarts <- base::computeRestarts [15:32:01.312] grepl <- base::grepl [15:32:01.312] restarts <- computeRestarts(cond) [15:32:01.312] for (restart in restarts) { [15:32:01.312] name <- restart$name [15:32:01.312] if (is.null(name)) [15:32:01.312] next [15:32:01.312] if (!grepl(pattern, name)) [15:32:01.312] next [15:32:01.312] invokeRestart(restart) [15:32:01.312] muffled <- TRUE [15:32:01.312] break [15:32:01.312] } [15:32:01.312] } [15:32:01.312] } [15:32:01.312] invisible(muffled) [15:32:01.312] } [15:32:01.312] muffleCondition(cond, pattern = "^muffle") [15:32:01.312] } [15:32:01.312] } [15:32:01.312] } [15:32:01.312] })) [15:32:01.312] }, error = function(ex) { [15:32:01.312] base::structure(base::list(value = NULL, visible = NULL, [15:32:01.312] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:32:01.312] ...future.rng), started = ...future.startTime, [15:32:01.312] finished = Sys.time(), session_uuid = NA_character_, [15:32:01.312] version = "1.8"), class = "FutureResult") [15:32:01.312] }, finally = { [15:32:01.312] if (!identical(...future.workdir, getwd())) [15:32:01.312] setwd(...future.workdir) [15:32:01.312] { [15:32:01.312] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:32:01.312] ...future.oldOptions$nwarnings <- NULL [15:32:01.312] } [15:32:01.312] base::options(...future.oldOptions) [15:32:01.312] if (.Platform$OS.type == "windows") { [15:32:01.312] old_names <- names(...future.oldEnvVars) [15:32:01.312] envs <- base::Sys.getenv() [15:32:01.312] names <- names(envs) [15:32:01.312] common <- intersect(names, old_names) [15:32:01.312] added <- setdiff(names, old_names) [15:32:01.312] removed <- setdiff(old_names, names) [15:32:01.312] changed <- common[...future.oldEnvVars[common] != [15:32:01.312] envs[common]] [15:32:01.312] NAMES <- toupper(changed) [15:32:01.312] args <- list() [15:32:01.312] for (kk in seq_along(NAMES)) { [15:32:01.312] name <- changed[[kk]] [15:32:01.312] NAME <- NAMES[[kk]] [15:32:01.312] if (name != NAME && is.element(NAME, old_names)) [15:32:01.312] next [15:32:01.312] args[[name]] <- ...future.oldEnvVars[[name]] [15:32:01.312] } [15:32:01.312] NAMES <- toupper(added) [15:32:01.312] for (kk in seq_along(NAMES)) { [15:32:01.312] name <- added[[kk]] [15:32:01.312] NAME <- NAMES[[kk]] [15:32:01.312] if (name != NAME && is.element(NAME, old_names)) [15:32:01.312] next [15:32:01.312] args[[name]] <- "" [15:32:01.312] } [15:32:01.312] NAMES <- toupper(removed) [15:32:01.312] for (kk in seq_along(NAMES)) { [15:32:01.312] name <- removed[[kk]] [15:32:01.312] NAME <- NAMES[[kk]] [15:32:01.312] if (name != NAME && is.element(NAME, old_names)) [15:32:01.312] next [15:32:01.312] args[[name]] <- ...future.oldEnvVars[[name]] [15:32:01.312] } [15:32:01.312] if (length(args) > 0) [15:32:01.312] base::do.call(base::Sys.setenv, args = args) [15:32:01.312] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:32:01.312] } [15:32:01.312] else { [15:32:01.312] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:32:01.312] } [15:32:01.312] { [15:32:01.312] if (base::length(...future.futureOptionsAdded) > [15:32:01.312] 0L) { [15:32:01.312] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:32:01.312] base::names(opts) <- ...future.futureOptionsAdded [15:32:01.312] base::options(opts) [15:32:01.312] } [15:32:01.312] { [15:32:01.312] { [15:32:01.312] base::options(mc.cores = ...future.mc.cores.old) [15:32:01.312] NULL [15:32:01.312] } [15:32:01.312] options(future.plan = NULL) [15:32:01.312] if (is.na(NA_character_)) [15:32:01.312] Sys.unsetenv("R_FUTURE_PLAN") [15:32:01.312] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:32:01.312] future::plan(...future.strategy.old, .cleanup = FALSE, [15:32:01.312] .init = FALSE) [15:32:01.312] } [15:32:01.312] } [15:32:01.312] } [15:32:01.312] }) [15:32:01.312] if (TRUE) { [15:32:01.312] base::sink(type = "output", split = FALSE) [15:32:01.312] if (TRUE) { [15:32:01.312] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:32:01.312] } [15:32:01.312] else { [15:32:01.312] ...future.result["stdout"] <- base::list(NULL) [15:32:01.312] } [15:32:01.312] base::close(...future.stdout) [15:32:01.312] ...future.stdout <- NULL [15:32:01.312] } [15:32:01.312] ...future.result$conditions <- ...future.conditions [15:32:01.312] ...future.result$finished <- base::Sys.time() [15:32:01.312] ...future.result [15:32:01.312] } [15:32:01.320] Exporting 5 global objects (56 bytes) to cluster node #1 ... [15:32:01.321] Exporting '...future.FUN' (56 bytes) to cluster node #1 ... [15:32:01.322] Exporting '...future.FUN' (56 bytes) to cluster node #1 ... DONE [15:32:01.322] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [15:32:01.323] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [15:32:01.324] Exporting '...future.elements_ii' (56 bytes) to cluster node #1 ... [15:32:01.324] Exporting '...future.elements_ii' (56 bytes) to cluster node #1 ... DONE [15:32:01.325] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:32:01.325] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:32:01.326] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:32:01.326] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:32:01.326] Exporting 5 global objects (56 bytes) to cluster node #1 ... DONE [15:32:01.328] MultisessionFuture started [15:32:01.328] - Launch lazy future ... done [15:32:01.328] run() for 'MultisessionFuture' ... done [15:32:01.328] Created future: [15:32:01.355] receiveMessageFromWorker() for ClusterFuture ... [15:32:01.355] - Validating connection of MultisessionFuture [15:32:01.356] - received message: FutureResult [15:32:01.356] - Received FutureResult [15:32:01.356] - Erased future from FutureRegistry [15:32:01.356] result() for ClusterFuture ... [15:32:01.357] - result already collected: FutureResult [15:32:01.357] result() for ClusterFuture ... done [15:32:01.357] receiveMessageFromWorker() for ClusterFuture ... done [15:32:01.329] MultisessionFuture: [15:32:01.329] Label: 'future_lapply-1' [15:32:01.329] Expression: [15:32:01.329] { [15:32:01.329] do.call(function(...) { [15:32:01.329] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:01.329] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:32:01.329] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:01.329] on.exit(options(oopts), add = TRUE) [15:32:01.329] } [15:32:01.329] { [15:32:01.329] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:32:01.329] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:01.329] ...future.FUN(...future.X_jj, ...) [15:32:01.329] }) [15:32:01.329] } [15:32:01.329] }, args = future.call.arguments) [15:32:01.329] } [15:32:01.329] Lazy evaluation: FALSE [15:32:01.329] Asynchronous evaluation: TRUE [15:32:01.329] Local evaluation: TRUE [15:32:01.329] Environment: R_GlobalEnv [15:32:01.329] Capture standard output: TRUE [15:32:01.329] Capture condition classes: 'condition' (excluding 'nothing') [15:32:01.329] Globals: 5 objects totaling 112 bytes (function '...future.FUN' of 56 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 56 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:32:01.329] Packages: [15:32:01.329] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:32:01.329] Resolved: TRUE [15:32:01.329] Value: [15:32:01.329] Conditions captured: [15:32:01.329] Early signaling: FALSE [15:32:01.329] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:32:01.329] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:32:01.358] Chunk #1 of 2 ... DONE [15:32:01.358] Chunk #2 of 2 ... [15:32:01.358] - Finding globals in 'X' for chunk #2 ... [15:32:01.358] getGlobalsAndPackages() ... [15:32:01.359] Searching for globals... [15:32:01.359] [15:32:01.360] Searching for globals ... DONE [15:32:01.360] - globals: [0] [15:32:01.360] getGlobalsAndPackages() ... DONE [15:32:01.360] + additional globals found: [n=0] [15:32:01.361] + additional namespaces needed: [n=0] [15:32:01.361] - Finding globals in 'X' for chunk #2 ... DONE [15:32:01.361] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:32:01.361] - seeds: [15:32:01.361] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:01.362] getGlobalsAndPackages() ... [15:32:01.362] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:01.362] Resolving globals: FALSE [15:32:01.362] Tweak future expression to call with '...' arguments ... [15:32:01.362] { [15:32:01.362] do.call(function(...) { [15:32:01.362] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:01.362] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:32:01.362] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:01.362] on.exit(options(oopts), add = TRUE) [15:32:01.362] } [15:32:01.362] { [15:32:01.362] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:32:01.362] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:01.362] ...future.FUN(...future.X_jj, ...) [15:32:01.362] }) [15:32:01.362] } [15:32:01.362] }, args = future.call.arguments) [15:32:01.362] } [15:32:01.363] Tweak future expression to call with '...' arguments ... DONE [15:32:01.363] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:01.364] [15:32:01.364] getGlobalsAndPackages() ... DONE [15:32:01.364] run() for 'Future' ... [15:32:01.364] - state: 'created' [15:32:01.365] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:32:01.379] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:32:01.379] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:32:01.380] - Field: 'node' [15:32:01.380] - Field: 'label' [15:32:01.380] - Field: 'local' [15:32:01.380] - Field: 'owner' [15:32:01.380] - Field: 'envir' [15:32:01.381] - Field: 'workers' [15:32:01.381] - Field: 'packages' [15:32:01.381] - Field: 'gc' [15:32:01.381] - Field: 'conditions' [15:32:01.381] - Field: 'persistent' [15:32:01.381] - Field: 'expr' [15:32:01.382] - Field: 'uuid' [15:32:01.382] - Field: 'seed' [15:32:01.382] - Field: 'version' [15:32:01.382] - Field: 'result' [15:32:01.382] - Field: 'asynchronous' [15:32:01.383] - Field: 'calls' [15:32:01.383] - Field: 'globals' [15:32:01.383] - Field: 'stdout' [15:32:01.383] - Field: 'earlySignal' [15:32:01.383] - Field: 'lazy' [15:32:01.384] - Field: 'state' [15:32:01.384] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:32:01.384] - Launch lazy future ... [15:32:01.384] Packages needed by the future expression (n = 0): [15:32:01.385] Packages needed by future strategies (n = 0): [15:32:01.385] { [15:32:01.385] { [15:32:01.385] { [15:32:01.385] ...future.startTime <- base::Sys.time() [15:32:01.385] { [15:32:01.385] { [15:32:01.385] { [15:32:01.385] { [15:32:01.385] base::local({ [15:32:01.385] has_future <- base::requireNamespace("future", [15:32:01.385] quietly = TRUE) [15:32:01.385] if (has_future) { [15:32:01.385] ns <- base::getNamespace("future") [15:32:01.385] version <- ns[[".package"]][["version"]] [15:32:01.385] if (is.null(version)) [15:32:01.385] version <- utils::packageVersion("future") [15:32:01.385] } [15:32:01.385] else { [15:32:01.385] version <- NULL [15:32:01.385] } [15:32:01.385] if (!has_future || version < "1.8.0") { [15:32:01.385] info <- base::c(r_version = base::gsub("R version ", [15:32:01.385] "", base::R.version$version.string), [15:32:01.385] platform = base::sprintf("%s (%s-bit)", [15:32:01.385] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:32:01.385] os = base::paste(base::Sys.info()[base::c("sysname", [15:32:01.385] "release", "version")], collapse = " "), [15:32:01.385] hostname = base::Sys.info()[["nodename"]]) [15:32:01.385] info <- base::sprintf("%s: %s", base::names(info), [15:32:01.385] info) [15:32:01.385] info <- base::paste(info, collapse = "; ") [15:32:01.385] if (!has_future) { [15:32:01.385] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:32:01.385] info) [15:32:01.385] } [15:32:01.385] else { [15:32:01.385] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:32:01.385] info, version) [15:32:01.385] } [15:32:01.385] base::stop(msg) [15:32:01.385] } [15:32:01.385] }) [15:32:01.385] } [15:32:01.385] ...future.mc.cores.old <- base::getOption("mc.cores") [15:32:01.385] base::options(mc.cores = 1L) [15:32:01.385] } [15:32:01.385] ...future.strategy.old <- future::plan("list") [15:32:01.385] options(future.plan = NULL) [15:32:01.385] Sys.unsetenv("R_FUTURE_PLAN") [15:32:01.385] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:32:01.385] } [15:32:01.385] ...future.workdir <- getwd() [15:32:01.385] } [15:32:01.385] ...future.oldOptions <- base::as.list(base::.Options) [15:32:01.385] ...future.oldEnvVars <- base::Sys.getenv() [15:32:01.385] } [15:32:01.385] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:32:01.385] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:32:01.385] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:32:01.385] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:32:01.385] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:32:01.385] future.stdout.windows.reencode = NULL, width = 80L) [15:32:01.385] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:32:01.385] base::names(...future.oldOptions)) [15:32:01.385] } [15:32:01.385] if (FALSE) { [15:32:01.385] } [15:32:01.385] else { [15:32:01.385] if (TRUE) { [15:32:01.385] ...future.stdout <- base::rawConnection(base::raw(0L), [15:32:01.385] open = "w") [15:32:01.385] } [15:32:01.385] else { [15:32:01.385] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:32:01.385] windows = "NUL", "/dev/null"), open = "w") [15:32:01.385] } [15:32:01.385] base::sink(...future.stdout, type = "output", split = FALSE) [15:32:01.385] base::on.exit(if (!base::is.null(...future.stdout)) { [15:32:01.385] base::sink(type = "output", split = FALSE) [15:32:01.385] base::close(...future.stdout) [15:32:01.385] }, add = TRUE) [15:32:01.385] } [15:32:01.385] ...future.frame <- base::sys.nframe() [15:32:01.385] ...future.conditions <- base::list() [15:32:01.385] ...future.rng <- base::globalenv()$.Random.seed [15:32:01.385] if (FALSE) { [15:32:01.385] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:32:01.385] "...future.value", "...future.globalenv.names", ".Random.seed") [15:32:01.385] } [15:32:01.385] ...future.result <- base::tryCatch({ [15:32:01.385] base::withCallingHandlers({ [15:32:01.385] ...future.value <- base::withVisible(base::local({ [15:32:01.385] ...future.makeSendCondition <- base::local({ [15:32:01.385] sendCondition <- NULL [15:32:01.385] function(frame = 1L) { [15:32:01.385] if (is.function(sendCondition)) [15:32:01.385] return(sendCondition) [15:32:01.385] ns <- getNamespace("parallel") [15:32:01.385] if (exists("sendData", mode = "function", [15:32:01.385] envir = ns)) { [15:32:01.385] parallel_sendData <- get("sendData", mode = "function", [15:32:01.385] envir = ns) [15:32:01.385] envir <- sys.frame(frame) [15:32:01.385] master <- NULL [15:32:01.385] while (!identical(envir, .GlobalEnv) && [15:32:01.385] !identical(envir, emptyenv())) { [15:32:01.385] if (exists("master", mode = "list", envir = envir, [15:32:01.385] inherits = FALSE)) { [15:32:01.385] master <- get("master", mode = "list", [15:32:01.385] envir = envir, inherits = FALSE) [15:32:01.385] if (inherits(master, c("SOCKnode", [15:32:01.385] "SOCK0node"))) { [15:32:01.385] sendCondition <<- function(cond) { [15:32:01.385] data <- list(type = "VALUE", value = cond, [15:32:01.385] success = TRUE) [15:32:01.385] parallel_sendData(master, data) [15:32:01.385] } [15:32:01.385] return(sendCondition) [15:32:01.385] } [15:32:01.385] } [15:32:01.385] frame <- frame + 1L [15:32:01.385] envir <- sys.frame(frame) [15:32:01.385] } [15:32:01.385] } [15:32:01.385] sendCondition <<- function(cond) NULL [15:32:01.385] } [15:32:01.385] }) [15:32:01.385] withCallingHandlers({ [15:32:01.385] { [15:32:01.385] do.call(function(...) { [15:32:01.385] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:01.385] if (!identical(...future.globals.maxSize.org, [15:32:01.385] ...future.globals.maxSize)) { [15:32:01.385] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:01.385] on.exit(options(oopts), add = TRUE) [15:32:01.385] } [15:32:01.385] { [15:32:01.385] lapply(seq_along(...future.elements_ii), [15:32:01.385] FUN = function(jj) { [15:32:01.385] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:01.385] ...future.FUN(...future.X_jj, ...) [15:32:01.385] }) [15:32:01.385] } [15:32:01.385] }, args = future.call.arguments) [15:32:01.385] } [15:32:01.385] }, immediateCondition = function(cond) { [15:32:01.385] sendCondition <- ...future.makeSendCondition() [15:32:01.385] sendCondition(cond) [15:32:01.385] muffleCondition <- function (cond, pattern = "^muffle") [15:32:01.385] { [15:32:01.385] inherits <- base::inherits [15:32:01.385] invokeRestart <- base::invokeRestart [15:32:01.385] is.null <- base::is.null [15:32:01.385] muffled <- FALSE [15:32:01.385] if (inherits(cond, "message")) { [15:32:01.385] muffled <- grepl(pattern, "muffleMessage") [15:32:01.385] if (muffled) [15:32:01.385] invokeRestart("muffleMessage") [15:32:01.385] } [15:32:01.385] else if (inherits(cond, "warning")) { [15:32:01.385] muffled <- grepl(pattern, "muffleWarning") [15:32:01.385] if (muffled) [15:32:01.385] invokeRestart("muffleWarning") [15:32:01.385] } [15:32:01.385] else if (inherits(cond, "condition")) { [15:32:01.385] if (!is.null(pattern)) { [15:32:01.385] computeRestarts <- base::computeRestarts [15:32:01.385] grepl <- base::grepl [15:32:01.385] restarts <- computeRestarts(cond) [15:32:01.385] for (restart in restarts) { [15:32:01.385] name <- restart$name [15:32:01.385] if (is.null(name)) [15:32:01.385] next [15:32:01.385] if (!grepl(pattern, name)) [15:32:01.385] next [15:32:01.385] invokeRestart(restart) [15:32:01.385] muffled <- TRUE [15:32:01.385] break [15:32:01.385] } [15:32:01.385] } [15:32:01.385] } [15:32:01.385] invisible(muffled) [15:32:01.385] } [15:32:01.385] muffleCondition(cond) [15:32:01.385] }) [15:32:01.385] })) [15:32:01.385] future::FutureResult(value = ...future.value$value, [15:32:01.385] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:32:01.385] ...future.rng), globalenv = if (FALSE) [15:32:01.385] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:32:01.385] ...future.globalenv.names)) [15:32:01.385] else NULL, started = ...future.startTime, version = "1.8") [15:32:01.385] }, condition = base::local({ [15:32:01.385] c <- base::c [15:32:01.385] inherits <- base::inherits [15:32:01.385] invokeRestart <- base::invokeRestart [15:32:01.385] length <- base::length [15:32:01.385] list <- base::list [15:32:01.385] seq.int <- base::seq.int [15:32:01.385] signalCondition <- base::signalCondition [15:32:01.385] sys.calls <- base::sys.calls [15:32:01.385] `[[` <- base::`[[` [15:32:01.385] `+` <- base::`+` [15:32:01.385] `<<-` <- base::`<<-` [15:32:01.385] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:32:01.385] calls[seq.int(from = from + 12L, to = length(calls) - [15:32:01.385] 3L)] [15:32:01.385] } [15:32:01.385] function(cond) { [15:32:01.385] is_error <- inherits(cond, "error") [15:32:01.385] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:32:01.385] NULL) [15:32:01.385] if (is_error) { [15:32:01.385] sessionInformation <- function() { [15:32:01.385] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:32:01.385] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:32:01.385] search = base::search(), system = base::Sys.info()) [15:32:01.385] } [15:32:01.385] ...future.conditions[[length(...future.conditions) + [15:32:01.385] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:32:01.385] cond$call), session = sessionInformation(), [15:32:01.385] timestamp = base::Sys.time(), signaled = 0L) [15:32:01.385] signalCondition(cond) [15:32:01.385] } [15:32:01.385] else if (!ignore && TRUE && inherits(cond, c("condition", [15:32:01.385] "immediateCondition"))) { [15:32:01.385] signal <- TRUE && inherits(cond, "immediateCondition") [15:32:01.385] ...future.conditions[[length(...future.conditions) + [15:32:01.385] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:32:01.385] if (TRUE && !signal) { [15:32:01.385] muffleCondition <- function (cond, pattern = "^muffle") [15:32:01.385] { [15:32:01.385] inherits <- base::inherits [15:32:01.385] invokeRestart <- base::invokeRestart [15:32:01.385] is.null <- base::is.null [15:32:01.385] muffled <- FALSE [15:32:01.385] if (inherits(cond, "message")) { [15:32:01.385] muffled <- grepl(pattern, "muffleMessage") [15:32:01.385] if (muffled) [15:32:01.385] invokeRestart("muffleMessage") [15:32:01.385] } [15:32:01.385] else if (inherits(cond, "warning")) { [15:32:01.385] muffled <- grepl(pattern, "muffleWarning") [15:32:01.385] if (muffled) [15:32:01.385] invokeRestart("muffleWarning") [15:32:01.385] } [15:32:01.385] else if (inherits(cond, "condition")) { [15:32:01.385] if (!is.null(pattern)) { [15:32:01.385] computeRestarts <- base::computeRestarts [15:32:01.385] grepl <- base::grepl [15:32:01.385] restarts <- computeRestarts(cond) [15:32:01.385] for (restart in restarts) { [15:32:01.385] name <- restart$name [15:32:01.385] if (is.null(name)) [15:32:01.385] next [15:32:01.385] if (!grepl(pattern, name)) [15:32:01.385] next [15:32:01.385] invokeRestart(restart) [15:32:01.385] muffled <- TRUE [15:32:01.385] break [15:32:01.385] } [15:32:01.385] } [15:32:01.385] } [15:32:01.385] invisible(muffled) [15:32:01.385] } [15:32:01.385] muffleCondition(cond, pattern = "^muffle") [15:32:01.385] } [15:32:01.385] } [15:32:01.385] else { [15:32:01.385] if (TRUE) { [15:32:01.385] muffleCondition <- function (cond, pattern = "^muffle") [15:32:01.385] { [15:32:01.385] inherits <- base::inherits [15:32:01.385] invokeRestart <- base::invokeRestart [15:32:01.385] is.null <- base::is.null [15:32:01.385] muffled <- FALSE [15:32:01.385] if (inherits(cond, "message")) { [15:32:01.385] muffled <- grepl(pattern, "muffleMessage") [15:32:01.385] if (muffled) [15:32:01.385] invokeRestart("muffleMessage") [15:32:01.385] } [15:32:01.385] else if (inherits(cond, "warning")) { [15:32:01.385] muffled <- grepl(pattern, "muffleWarning") [15:32:01.385] if (muffled) [15:32:01.385] invokeRestart("muffleWarning") [15:32:01.385] } [15:32:01.385] else if (inherits(cond, "condition")) { [15:32:01.385] if (!is.null(pattern)) { [15:32:01.385] computeRestarts <- base::computeRestarts [15:32:01.385] grepl <- base::grepl [15:32:01.385] restarts <- computeRestarts(cond) [15:32:01.385] for (restart in restarts) { [15:32:01.385] name <- restart$name [15:32:01.385] if (is.null(name)) [15:32:01.385] next [15:32:01.385] if (!grepl(pattern, name)) [15:32:01.385] next [15:32:01.385] invokeRestart(restart) [15:32:01.385] muffled <- TRUE [15:32:01.385] break [15:32:01.385] } [15:32:01.385] } [15:32:01.385] } [15:32:01.385] invisible(muffled) [15:32:01.385] } [15:32:01.385] muffleCondition(cond, pattern = "^muffle") [15:32:01.385] } [15:32:01.385] } [15:32:01.385] } [15:32:01.385] })) [15:32:01.385] }, error = function(ex) { [15:32:01.385] base::structure(base::list(value = NULL, visible = NULL, [15:32:01.385] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:32:01.385] ...future.rng), started = ...future.startTime, [15:32:01.385] finished = Sys.time(), session_uuid = NA_character_, [15:32:01.385] version = "1.8"), class = "FutureResult") [15:32:01.385] }, finally = { [15:32:01.385] if (!identical(...future.workdir, getwd())) [15:32:01.385] setwd(...future.workdir) [15:32:01.385] { [15:32:01.385] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:32:01.385] ...future.oldOptions$nwarnings <- NULL [15:32:01.385] } [15:32:01.385] base::options(...future.oldOptions) [15:32:01.385] if (.Platform$OS.type == "windows") { [15:32:01.385] old_names <- names(...future.oldEnvVars) [15:32:01.385] envs <- base::Sys.getenv() [15:32:01.385] names <- names(envs) [15:32:01.385] common <- intersect(names, old_names) [15:32:01.385] added <- setdiff(names, old_names) [15:32:01.385] removed <- setdiff(old_names, names) [15:32:01.385] changed <- common[...future.oldEnvVars[common] != [15:32:01.385] envs[common]] [15:32:01.385] NAMES <- toupper(changed) [15:32:01.385] args <- list() [15:32:01.385] for (kk in seq_along(NAMES)) { [15:32:01.385] name <- changed[[kk]] [15:32:01.385] NAME <- NAMES[[kk]] [15:32:01.385] if (name != NAME && is.element(NAME, old_names)) [15:32:01.385] next [15:32:01.385] args[[name]] <- ...future.oldEnvVars[[name]] [15:32:01.385] } [15:32:01.385] NAMES <- toupper(added) [15:32:01.385] for (kk in seq_along(NAMES)) { [15:32:01.385] name <- added[[kk]] [15:32:01.385] NAME <- NAMES[[kk]] [15:32:01.385] if (name != NAME && is.element(NAME, old_names)) [15:32:01.385] next [15:32:01.385] args[[name]] <- "" [15:32:01.385] } [15:32:01.385] NAMES <- toupper(removed) [15:32:01.385] for (kk in seq_along(NAMES)) { [15:32:01.385] name <- removed[[kk]] [15:32:01.385] NAME <- NAMES[[kk]] [15:32:01.385] if (name != NAME && is.element(NAME, old_names)) [15:32:01.385] next [15:32:01.385] args[[name]] <- ...future.oldEnvVars[[name]] [15:32:01.385] } [15:32:01.385] if (length(args) > 0) [15:32:01.385] base::do.call(base::Sys.setenv, args = args) [15:32:01.385] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:32:01.385] } [15:32:01.385] else { [15:32:01.385] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:32:01.385] } [15:32:01.385] { [15:32:01.385] if (base::length(...future.futureOptionsAdded) > [15:32:01.385] 0L) { [15:32:01.385] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:32:01.385] base::names(opts) <- ...future.futureOptionsAdded [15:32:01.385] base::options(opts) [15:32:01.385] } [15:32:01.385] { [15:32:01.385] { [15:32:01.385] base::options(mc.cores = ...future.mc.cores.old) [15:32:01.385] NULL [15:32:01.385] } [15:32:01.385] options(future.plan = NULL) [15:32:01.385] if (is.na(NA_character_)) [15:32:01.385] Sys.unsetenv("R_FUTURE_PLAN") [15:32:01.385] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:32:01.385] future::plan(...future.strategy.old, .cleanup = FALSE, [15:32:01.385] .init = FALSE) [15:32:01.385] } [15:32:01.385] } [15:32:01.385] } [15:32:01.385] }) [15:32:01.385] if (TRUE) { [15:32:01.385] base::sink(type = "output", split = FALSE) [15:32:01.385] if (TRUE) { [15:32:01.385] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:32:01.385] } [15:32:01.385] else { [15:32:01.385] ...future.result["stdout"] <- base::list(NULL) [15:32:01.385] } [15:32:01.385] base::close(...future.stdout) [15:32:01.385] ...future.stdout <- NULL [15:32:01.385] } [15:32:01.385] ...future.result$conditions <- ...future.conditions [15:32:01.385] ...future.result$finished <- base::Sys.time() [15:32:01.385] ...future.result [15:32:01.385] } [15:32:01.392] Exporting 5 global objects (56 bytes) to cluster node #1 ... [15:32:01.392] Exporting '...future.FUN' (56 bytes) to cluster node #1 ... [15:32:01.393] Exporting '...future.FUN' (56 bytes) to cluster node #1 ... DONE [15:32:01.394] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [15:32:01.395] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [15:32:01.395] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... [15:32:01.396] Exporting '...future.elements_ii' (112 bytes) to cluster node #1 ... DONE [15:32:01.397] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:32:01.397] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:32:01.398] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:32:01.399] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:32:01.399] Exporting 5 global objects (56 bytes) to cluster node #1 ... DONE [15:32:01.400] MultisessionFuture started [15:32:01.400] - Launch lazy future ... done [15:32:01.400] run() for 'MultisessionFuture' ... done [15:32:01.401] Created future: [15:32:01.430] receiveMessageFromWorker() for ClusterFuture ... [15:32:01.430] - Validating connection of MultisessionFuture [15:32:01.431] - received message: FutureResult [15:32:01.431] - Received FutureResult [15:32:01.431] - Erased future from FutureRegistry [15:32:01.432] result() for ClusterFuture ... [15:32:01.432] - result already collected: FutureResult [15:32:01.432] result() for ClusterFuture ... done [15:32:01.432] receiveMessageFromWorker() for ClusterFuture ... done [15:32:01.401] MultisessionFuture: [15:32:01.401] Label: 'future_lapply-2' [15:32:01.401] Expression: [15:32:01.401] { [15:32:01.401] do.call(function(...) { [15:32:01.401] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:01.401] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:32:01.401] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:01.401] on.exit(options(oopts), add = TRUE) [15:32:01.401] } [15:32:01.401] { [15:32:01.401] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:32:01.401] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:01.401] ...future.FUN(...future.X_jj, ...) [15:32:01.401] }) [15:32:01.401] } [15:32:01.401] }, args = future.call.arguments) [15:32:01.401] } [15:32:01.401] Lazy evaluation: FALSE [15:32:01.401] Asynchronous evaluation: TRUE [15:32:01.401] Local evaluation: TRUE [15:32:01.401] Environment: R_GlobalEnv [15:32:01.401] Capture standard output: TRUE [15:32:01.401] Capture condition classes: 'condition' (excluding 'nothing') [15:32:01.401] Globals: 5 objects totaling 168 bytes (function '...future.FUN' of 56 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 112 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:32:01.401] Packages: [15:32:01.401] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:32:01.401] Resolved: TRUE [15:32:01.401] Value: [15:32:01.401] Conditions captured: [15:32:01.401] Early signaling: FALSE [15:32:01.401] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:32:01.401] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:32:01.433] Chunk #2 of 2 ... DONE [15:32:01.433] Launching 2 futures (chunks) ... DONE [15:32:01.434] Resolving 2 futures (chunks) ... [15:32:01.434] resolve() on list ... [15:32:01.434] recursive: 0 [15:32:01.434] length: 2 [15:32:01.435] [15:32:01.435] Future #1 [15:32:01.435] result() for ClusterFuture ... [15:32:01.435] - result already collected: FutureResult [15:32:01.435] result() for ClusterFuture ... done [15:32:01.435] result() for ClusterFuture ... [15:32:01.436] - result already collected: FutureResult [15:32:01.436] result() for ClusterFuture ... done [15:32:01.436] signalConditionsASAP(MultisessionFuture, pos=1) ... [15:32:01.436] - nx: 2 [15:32:01.436] - relay: TRUE [15:32:01.437] - stdout: TRUE [15:32:01.437] - signal: TRUE [15:32:01.437] - resignal: FALSE [15:32:01.437] - force: TRUE [15:32:01.437] - relayed: [n=2] FALSE, FALSE [15:32:01.438] - queued futures: [n=2] FALSE, FALSE [15:32:01.438] - until=1 [15:32:01.438] - relaying element #1 [15:32:01.438] result() for ClusterFuture ... [15:32:01.438] - result already collected: FutureResult [15:32:01.438] result() for ClusterFuture ... done [15:32:01.439] result() for ClusterFuture ... [15:32:01.439] - result already collected: FutureResult [15:32:01.439] result() for ClusterFuture ... done [15:32:01.440] result() for ClusterFuture ... [15:32:01.440] - result already collected: FutureResult [15:32:01.440] result() for ClusterFuture ... done [15:32:01.440] result() for ClusterFuture ... [15:32:01.441] - result already collected: FutureResult [15:32:01.441] result() for ClusterFuture ... done [15:32:01.441] - relayed: [n=2] TRUE, FALSE [15:32:01.441] - queued futures: [n=2] TRUE, FALSE [15:32:01.442] signalConditionsASAP(MultisessionFuture, pos=1) ... done [15:32:01.442] length: 1 (resolved future 1) [15:32:01.442] Future #2 [15:32:01.442] result() for ClusterFuture ... [15:32:01.443] - result already collected: FutureResult [15:32:01.443] result() for ClusterFuture ... done [15:32:01.443] result() for ClusterFuture ... [15:32:01.443] - result already collected: FutureResult [15:32:01.444] result() for ClusterFuture ... done [15:32:01.444] signalConditionsASAP(MultisessionFuture, pos=2) ... [15:32:01.444] - nx: 2 [15:32:01.444] - relay: TRUE [15:32:01.445] - stdout: TRUE [15:32:01.445] - signal: TRUE [15:32:01.445] - resignal: FALSE [15:32:01.445] - force: TRUE [15:32:01.446] - relayed: [n=2] TRUE, FALSE [15:32:01.446] - queued futures: [n=2] TRUE, FALSE [15:32:01.446] - until=2 [15:32:01.446] - relaying element #2 [15:32:01.447] result() for ClusterFuture ... [15:32:01.447] - result already collected: FutureResult [15:32:01.447] result() for ClusterFuture ... done [15:32:01.447] result() for ClusterFuture ... [15:32:01.448] - result already collected: FutureResult [15:32:01.448] result() for ClusterFuture ... done [15:32:01.448] result() for ClusterFuture ... [15:32:01.448] - result already collected: FutureResult [15:32:01.449] result() for ClusterFuture ... done [15:32:01.449] result() for ClusterFuture ... [15:32:01.449] - result already collected: FutureResult [15:32:01.449] result() for ClusterFuture ... done [15:32:01.450] - relayed: [n=2] TRUE, TRUE [15:32:01.450] - queued futures: [n=2] TRUE, TRUE [15:32:01.450] signalConditionsASAP(MultisessionFuture, pos=2) ... done [15:32:01.450] length: 0 (resolved future 2) [15:32:01.451] Relaying remaining futures [15:32:01.451] signalConditionsASAP(NULL, pos=0) ... [15:32:01.451] - nx: 2 [15:32:01.451] - relay: TRUE [15:32:01.452] - stdout: TRUE [15:32:01.452] - signal: TRUE [15:32:01.452] - resignal: FALSE [15:32:01.452] - force: TRUE [15:32:01.453] - relayed: [n=2] TRUE, TRUE [15:32:01.453] - queued futures: [n=2] TRUE, TRUE - flush all [15:32:01.453] - relayed: [n=2] TRUE, TRUE [15:32:01.453] - queued futures: [n=2] TRUE, TRUE [15:32:01.454] signalConditionsASAP(NULL, pos=0) ... done [15:32:01.454] resolve() on list ... DONE [15:32:01.454] result() for ClusterFuture ... [15:32:01.455] - result already collected: FutureResult [15:32:01.455] result() for ClusterFuture ... done [15:32:01.455] result() for ClusterFuture ... [15:32:01.455] - result already collected: FutureResult [15:32:01.456] result() for ClusterFuture ... done [15:32:01.456] result() for ClusterFuture ... [15:32:01.456] - result already collected: FutureResult [15:32:01.456] result() for ClusterFuture ... done [15:32:01.457] result() for ClusterFuture ... [15:32:01.457] - result already collected: FutureResult [15:32:01.457] result() for ClusterFuture ... done [15:32:01.457] - Number of value chunks collected: 2 [15:32:01.458] Resolving 2 futures (chunks) ... DONE [15:32:01.458] Reducing values from 2 chunks ... [15:32:01.458] - Number of values collected after concatenation: 3 [15:32:01.458] - Number of values expected: 3 [15:32:01.459] Reducing values from 2 chunks ... DONE [15:32:01.459] future_lapply() ... DONE - future_lapply(x, ...) where x[[i]] subsets via S3 method ... [15:32:01.459] future_lapply() ... [15:32:01.468] Number of chunks: 2 [15:32:01.468] getGlobalsAndPackagesXApply() ... [15:32:01.468] - future.globals: TRUE [15:32:01.469] getGlobalsAndPackages() ... [15:32:01.469] Searching for globals... [15:32:01.471] - globals found: [1] 'FUN' [15:32:01.471] Searching for globals ... DONE [15:32:01.471] Resolving globals: FALSE [15:32:01.472] The total size of the 1 globals is 848 bytes (848 bytes) [15:32:01.472] The total size of the 1 globals exported for future expression ('FUN()') is 848 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (848 bytes of class 'function') [15:32:01.472] - globals: [1] 'FUN' [15:32:01.473] [15:32:01.473] getGlobalsAndPackages() ... DONE [15:32:01.473] - globals found/used: [n=1] 'FUN' [15:32:01.473] - needed namespaces: [n=0] [15:32:01.474] Finding globals ... DONE [15:32:01.474] - use_args: TRUE [15:32:01.474] - Getting '...' globals ... [15:32:01.474] resolve() on list ... [15:32:01.474] recursive: 0 [15:32:01.475] length: 1 [15:32:01.475] elements: '...' [15:32:01.475] length: 0 (resolved future 1) [15:32:01.475] resolve() on list ... DONE [15:32:01.475] - '...' content: [n=0] [15:32:01.476] List of 1 [15:32:01.476] $ ...: list() [15:32:01.476] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:32:01.476] - attr(*, "where")=List of 1 [15:32:01.476] ..$ ...: [15:32:01.476] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:32:01.476] - attr(*, "resolved")= logi TRUE [15:32:01.476] - attr(*, "total_size")= num NA [15:32:01.480] - Getting '...' globals ... DONE [15:32:01.480] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [15:32:01.480] List of 2 [15:32:01.480] $ ...future.FUN:function (x) [15:32:01.480] $ ... : list() [15:32:01.480] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [15:32:01.480] - attr(*, "where")=List of 2 [15:32:01.480] ..$ ...future.FUN: [15:32:01.480] ..$ ... : [15:32:01.480] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [15:32:01.480] - attr(*, "resolved")= logi FALSE [15:32:01.480] - attr(*, "total_size")= num 848 [15:32:01.483] Packages to be attached in all futures: [n=0] [15:32:01.484] getGlobalsAndPackagesXApply() ... DONE [15:32:01.484] Number of futures (= number of chunks): 2 [15:32:01.484] Launching 2 futures (chunks) ... [15:32:01.485] Chunk #1 of 2 ... [15:32:01.485] - Finding globals in 'X' for chunk #1 ... [15:32:01.485] getGlobalsAndPackages() ... [15:32:01.485] Searching for globals... [15:32:01.486] [15:32:01.486] Searching for globals ... DONE [15:32:01.486] - globals: [0] [15:32:01.487] getGlobalsAndPackages() ... DONE [15:32:01.487] + additional globals found: [n=0] [15:32:01.487] + additional namespaces needed: [n=0] [15:32:01.487] - Finding globals in 'X' for chunk #1 ... DONE [15:32:01.487] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:32:01.487] - seeds: [15:32:01.487] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:01.488] getGlobalsAndPackages() ... [15:32:01.488] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:01.488] Resolving globals: FALSE [15:32:01.488] Tweak future expression to call with '...' arguments ... [15:32:01.488] { [15:32:01.488] do.call(function(...) { [15:32:01.488] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:01.488] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:32:01.488] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:01.488] on.exit(options(oopts), add = TRUE) [15:32:01.488] } [15:32:01.488] { [15:32:01.488] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:32:01.488] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:01.488] ...future.FUN(...future.X_jj, ...) [15:32:01.488] }) [15:32:01.488] } [15:32:01.488] }, args = future.call.arguments) [15:32:01.488] } [15:32:01.489] Tweak future expression to call with '...' arguments ... DONE [15:32:01.490] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:01.490] [15:32:01.490] getGlobalsAndPackages() ... DONE [15:32:01.491] run() for 'Future' ... [15:32:01.491] - state: 'created' [15:32:01.491] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:32:01.505] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:32:01.506] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:32:01.506] - Field: 'node' [15:32:01.506] - Field: 'label' [15:32:01.506] - Field: 'local' [15:32:01.506] - Field: 'owner' [15:32:01.506] - Field: 'envir' [15:32:01.507] - Field: 'workers' [15:32:01.507] - Field: 'packages' [15:32:01.507] - Field: 'gc' [15:32:01.507] - Field: 'conditions' [15:32:01.507] - Field: 'persistent' [15:32:01.507] - Field: 'expr' [15:32:01.508] - Field: 'uuid' [15:32:01.508] - Field: 'seed' [15:32:01.508] - Field: 'version' [15:32:01.508] - Field: 'result' [15:32:01.508] - Field: 'asynchronous' [15:32:01.508] - Field: 'calls' [15:32:01.508] - Field: 'globals' [15:32:01.509] - Field: 'stdout' [15:32:01.509] - Field: 'earlySignal' [15:32:01.509] - Field: 'lazy' [15:32:01.509] - Field: 'state' [15:32:01.509] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:32:01.510] - Launch lazy future ... [15:32:01.510] Packages needed by the future expression (n = 0): [15:32:01.510] Packages needed by future strategies (n = 0): [15:32:01.511] { [15:32:01.511] { [15:32:01.511] { [15:32:01.511] ...future.startTime <- base::Sys.time() [15:32:01.511] { [15:32:01.511] { [15:32:01.511] { [15:32:01.511] { [15:32:01.511] base::local({ [15:32:01.511] has_future <- base::requireNamespace("future", [15:32:01.511] quietly = TRUE) [15:32:01.511] if (has_future) { [15:32:01.511] ns <- base::getNamespace("future") [15:32:01.511] version <- ns[[".package"]][["version"]] [15:32:01.511] if (is.null(version)) [15:32:01.511] version <- utils::packageVersion("future") [15:32:01.511] } [15:32:01.511] else { [15:32:01.511] version <- NULL [15:32:01.511] } [15:32:01.511] if (!has_future || version < "1.8.0") { [15:32:01.511] info <- base::c(r_version = base::gsub("R version ", [15:32:01.511] "", base::R.version$version.string), [15:32:01.511] platform = base::sprintf("%s (%s-bit)", [15:32:01.511] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:32:01.511] os = base::paste(base::Sys.info()[base::c("sysname", [15:32:01.511] "release", "version")], collapse = " "), [15:32:01.511] hostname = base::Sys.info()[["nodename"]]) [15:32:01.511] info <- base::sprintf("%s: %s", base::names(info), [15:32:01.511] info) [15:32:01.511] info <- base::paste(info, collapse = "; ") [15:32:01.511] if (!has_future) { [15:32:01.511] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:32:01.511] info) [15:32:01.511] } [15:32:01.511] else { [15:32:01.511] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:32:01.511] info, version) [15:32:01.511] } [15:32:01.511] base::stop(msg) [15:32:01.511] } [15:32:01.511] }) [15:32:01.511] } [15:32:01.511] ...future.mc.cores.old <- base::getOption("mc.cores") [15:32:01.511] base::options(mc.cores = 1L) [15:32:01.511] } [15:32:01.511] ...future.strategy.old <- future::plan("list") [15:32:01.511] options(future.plan = NULL) [15:32:01.511] Sys.unsetenv("R_FUTURE_PLAN") [15:32:01.511] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:32:01.511] } [15:32:01.511] ...future.workdir <- getwd() [15:32:01.511] } [15:32:01.511] ...future.oldOptions <- base::as.list(base::.Options) [15:32:01.511] ...future.oldEnvVars <- base::Sys.getenv() [15:32:01.511] } [15:32:01.511] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:32:01.511] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:32:01.511] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:32:01.511] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:32:01.511] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:32:01.511] future.stdout.windows.reencode = NULL, width = 80L) [15:32:01.511] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:32:01.511] base::names(...future.oldOptions)) [15:32:01.511] } [15:32:01.511] if (FALSE) { [15:32:01.511] } [15:32:01.511] else { [15:32:01.511] if (TRUE) { [15:32:01.511] ...future.stdout <- base::rawConnection(base::raw(0L), [15:32:01.511] open = "w") [15:32:01.511] } [15:32:01.511] else { [15:32:01.511] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:32:01.511] windows = "NUL", "/dev/null"), open = "w") [15:32:01.511] } [15:32:01.511] base::sink(...future.stdout, type = "output", split = FALSE) [15:32:01.511] base::on.exit(if (!base::is.null(...future.stdout)) { [15:32:01.511] base::sink(type = "output", split = FALSE) [15:32:01.511] base::close(...future.stdout) [15:32:01.511] }, add = TRUE) [15:32:01.511] } [15:32:01.511] ...future.frame <- base::sys.nframe() [15:32:01.511] ...future.conditions <- base::list() [15:32:01.511] ...future.rng <- base::globalenv()$.Random.seed [15:32:01.511] if (FALSE) { [15:32:01.511] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:32:01.511] "...future.value", "...future.globalenv.names", ".Random.seed") [15:32:01.511] } [15:32:01.511] ...future.result <- base::tryCatch({ [15:32:01.511] base::withCallingHandlers({ [15:32:01.511] ...future.value <- base::withVisible(base::local({ [15:32:01.511] ...future.makeSendCondition <- base::local({ [15:32:01.511] sendCondition <- NULL [15:32:01.511] function(frame = 1L) { [15:32:01.511] if (is.function(sendCondition)) [15:32:01.511] return(sendCondition) [15:32:01.511] ns <- getNamespace("parallel") [15:32:01.511] if (exists("sendData", mode = "function", [15:32:01.511] envir = ns)) { [15:32:01.511] parallel_sendData <- get("sendData", mode = "function", [15:32:01.511] envir = ns) [15:32:01.511] envir <- sys.frame(frame) [15:32:01.511] master <- NULL [15:32:01.511] while (!identical(envir, .GlobalEnv) && [15:32:01.511] !identical(envir, emptyenv())) { [15:32:01.511] if (exists("master", mode = "list", envir = envir, [15:32:01.511] inherits = FALSE)) { [15:32:01.511] master <- get("master", mode = "list", [15:32:01.511] envir = envir, inherits = FALSE) [15:32:01.511] if (inherits(master, c("SOCKnode", [15:32:01.511] "SOCK0node"))) { [15:32:01.511] sendCondition <<- function(cond) { [15:32:01.511] data <- list(type = "VALUE", value = cond, [15:32:01.511] success = TRUE) [15:32:01.511] parallel_sendData(master, data) [15:32:01.511] } [15:32:01.511] return(sendCondition) [15:32:01.511] } [15:32:01.511] } [15:32:01.511] frame <- frame + 1L [15:32:01.511] envir <- sys.frame(frame) [15:32:01.511] } [15:32:01.511] } [15:32:01.511] sendCondition <<- function(cond) NULL [15:32:01.511] } [15:32:01.511] }) [15:32:01.511] withCallingHandlers({ [15:32:01.511] { [15:32:01.511] do.call(function(...) { [15:32:01.511] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:01.511] if (!identical(...future.globals.maxSize.org, [15:32:01.511] ...future.globals.maxSize)) { [15:32:01.511] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:01.511] on.exit(options(oopts), add = TRUE) [15:32:01.511] } [15:32:01.511] { [15:32:01.511] lapply(seq_along(...future.elements_ii), [15:32:01.511] FUN = function(jj) { [15:32:01.511] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:01.511] ...future.FUN(...future.X_jj, ...) [15:32:01.511] }) [15:32:01.511] } [15:32:01.511] }, args = future.call.arguments) [15:32:01.511] } [15:32:01.511] }, immediateCondition = function(cond) { [15:32:01.511] sendCondition <- ...future.makeSendCondition() [15:32:01.511] sendCondition(cond) [15:32:01.511] muffleCondition <- function (cond, pattern = "^muffle") [15:32:01.511] { [15:32:01.511] inherits <- base::inherits [15:32:01.511] invokeRestart <- base::invokeRestart [15:32:01.511] is.null <- base::is.null [15:32:01.511] muffled <- FALSE [15:32:01.511] if (inherits(cond, "message")) { [15:32:01.511] muffled <- grepl(pattern, "muffleMessage") [15:32:01.511] if (muffled) [15:32:01.511] invokeRestart("muffleMessage") [15:32:01.511] } [15:32:01.511] else if (inherits(cond, "warning")) { [15:32:01.511] muffled <- grepl(pattern, "muffleWarning") [15:32:01.511] if (muffled) [15:32:01.511] invokeRestart("muffleWarning") [15:32:01.511] } [15:32:01.511] else if (inherits(cond, "condition")) { [15:32:01.511] if (!is.null(pattern)) { [15:32:01.511] computeRestarts <- base::computeRestarts [15:32:01.511] grepl <- base::grepl [15:32:01.511] restarts <- computeRestarts(cond) [15:32:01.511] for (restart in restarts) { [15:32:01.511] name <- restart$name [15:32:01.511] if (is.null(name)) [15:32:01.511] next [15:32:01.511] if (!grepl(pattern, name)) [15:32:01.511] next [15:32:01.511] invokeRestart(restart) [15:32:01.511] muffled <- TRUE [15:32:01.511] break [15:32:01.511] } [15:32:01.511] } [15:32:01.511] } [15:32:01.511] invisible(muffled) [15:32:01.511] } [15:32:01.511] muffleCondition(cond) [15:32:01.511] }) [15:32:01.511] })) [15:32:01.511] future::FutureResult(value = ...future.value$value, [15:32:01.511] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:32:01.511] ...future.rng), globalenv = if (FALSE) [15:32:01.511] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:32:01.511] ...future.globalenv.names)) [15:32:01.511] else NULL, started = ...future.startTime, version = "1.8") [15:32:01.511] }, condition = base::local({ [15:32:01.511] c <- base::c [15:32:01.511] inherits <- base::inherits [15:32:01.511] invokeRestart <- base::invokeRestart [15:32:01.511] length <- base::length [15:32:01.511] list <- base::list [15:32:01.511] seq.int <- base::seq.int [15:32:01.511] signalCondition <- base::signalCondition [15:32:01.511] sys.calls <- base::sys.calls [15:32:01.511] `[[` <- base::`[[` [15:32:01.511] `+` <- base::`+` [15:32:01.511] `<<-` <- base::`<<-` [15:32:01.511] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:32:01.511] calls[seq.int(from = from + 12L, to = length(calls) - [15:32:01.511] 3L)] [15:32:01.511] } [15:32:01.511] function(cond) { [15:32:01.511] is_error <- inherits(cond, "error") [15:32:01.511] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:32:01.511] NULL) [15:32:01.511] if (is_error) { [15:32:01.511] sessionInformation <- function() { [15:32:01.511] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:32:01.511] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:32:01.511] search = base::search(), system = base::Sys.info()) [15:32:01.511] } [15:32:01.511] ...future.conditions[[length(...future.conditions) + [15:32:01.511] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:32:01.511] cond$call), session = sessionInformation(), [15:32:01.511] timestamp = base::Sys.time(), signaled = 0L) [15:32:01.511] signalCondition(cond) [15:32:01.511] } [15:32:01.511] else if (!ignore && TRUE && inherits(cond, c("condition", [15:32:01.511] "immediateCondition"))) { [15:32:01.511] signal <- TRUE && inherits(cond, "immediateCondition") [15:32:01.511] ...future.conditions[[length(...future.conditions) + [15:32:01.511] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:32:01.511] if (TRUE && !signal) { [15:32:01.511] muffleCondition <- function (cond, pattern = "^muffle") [15:32:01.511] { [15:32:01.511] inherits <- base::inherits [15:32:01.511] invokeRestart <- base::invokeRestart [15:32:01.511] is.null <- base::is.null [15:32:01.511] muffled <- FALSE [15:32:01.511] if (inherits(cond, "message")) { [15:32:01.511] muffled <- grepl(pattern, "muffleMessage") [15:32:01.511] if (muffled) [15:32:01.511] invokeRestart("muffleMessage") [15:32:01.511] } [15:32:01.511] else if (inherits(cond, "warning")) { [15:32:01.511] muffled <- grepl(pattern, "muffleWarning") [15:32:01.511] if (muffled) [15:32:01.511] invokeRestart("muffleWarning") [15:32:01.511] } [15:32:01.511] else if (inherits(cond, "condition")) { [15:32:01.511] if (!is.null(pattern)) { [15:32:01.511] computeRestarts <- base::computeRestarts [15:32:01.511] grepl <- base::grepl [15:32:01.511] restarts <- computeRestarts(cond) [15:32:01.511] for (restart in restarts) { [15:32:01.511] name <- restart$name [15:32:01.511] if (is.null(name)) [15:32:01.511] next [15:32:01.511] if (!grepl(pattern, name)) [15:32:01.511] next [15:32:01.511] invokeRestart(restart) [15:32:01.511] muffled <- TRUE [15:32:01.511] break [15:32:01.511] } [15:32:01.511] } [15:32:01.511] } [15:32:01.511] invisible(muffled) [15:32:01.511] } [15:32:01.511] muffleCondition(cond, pattern = "^muffle") [15:32:01.511] } [15:32:01.511] } [15:32:01.511] else { [15:32:01.511] if (TRUE) { [15:32:01.511] muffleCondition <- function (cond, pattern = "^muffle") [15:32:01.511] { [15:32:01.511] inherits <- base::inherits [15:32:01.511] invokeRestart <- base::invokeRestart [15:32:01.511] is.null <- base::is.null [15:32:01.511] muffled <- FALSE [15:32:01.511] if (inherits(cond, "message")) { [15:32:01.511] muffled <- grepl(pattern, "muffleMessage") [15:32:01.511] if (muffled) [15:32:01.511] invokeRestart("muffleMessage") [15:32:01.511] } [15:32:01.511] else if (inherits(cond, "warning")) { [15:32:01.511] muffled <- grepl(pattern, "muffleWarning") [15:32:01.511] if (muffled) [15:32:01.511] invokeRestart("muffleWarning") [15:32:01.511] } [15:32:01.511] else if (inherits(cond, "condition")) { [15:32:01.511] if (!is.null(pattern)) { [15:32:01.511] computeRestarts <- base::computeRestarts [15:32:01.511] grepl <- base::grepl [15:32:01.511] restarts <- computeRestarts(cond) [15:32:01.511] for (restart in restarts) { [15:32:01.511] name <- restart$name [15:32:01.511] if (is.null(name)) [15:32:01.511] next [15:32:01.511] if (!grepl(pattern, name)) [15:32:01.511] next [15:32:01.511] invokeRestart(restart) [15:32:01.511] muffled <- TRUE [15:32:01.511] break [15:32:01.511] } [15:32:01.511] } [15:32:01.511] } [15:32:01.511] invisible(muffled) [15:32:01.511] } [15:32:01.511] muffleCondition(cond, pattern = "^muffle") [15:32:01.511] } [15:32:01.511] } [15:32:01.511] } [15:32:01.511] })) [15:32:01.511] }, error = function(ex) { [15:32:01.511] base::structure(base::list(value = NULL, visible = NULL, [15:32:01.511] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:32:01.511] ...future.rng), started = ...future.startTime, [15:32:01.511] finished = Sys.time(), session_uuid = NA_character_, [15:32:01.511] version = "1.8"), class = "FutureResult") [15:32:01.511] }, finally = { [15:32:01.511] if (!identical(...future.workdir, getwd())) [15:32:01.511] setwd(...future.workdir) [15:32:01.511] { [15:32:01.511] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:32:01.511] ...future.oldOptions$nwarnings <- NULL [15:32:01.511] } [15:32:01.511] base::options(...future.oldOptions) [15:32:01.511] if (.Platform$OS.type == "windows") { [15:32:01.511] old_names <- names(...future.oldEnvVars) [15:32:01.511] envs <- base::Sys.getenv() [15:32:01.511] names <- names(envs) [15:32:01.511] common <- intersect(names, old_names) [15:32:01.511] added <- setdiff(names, old_names) [15:32:01.511] removed <- setdiff(old_names, names) [15:32:01.511] changed <- common[...future.oldEnvVars[common] != [15:32:01.511] envs[common]] [15:32:01.511] NAMES <- toupper(changed) [15:32:01.511] args <- list() [15:32:01.511] for (kk in seq_along(NAMES)) { [15:32:01.511] name <- changed[[kk]] [15:32:01.511] NAME <- NAMES[[kk]] [15:32:01.511] if (name != NAME && is.element(NAME, old_names)) [15:32:01.511] next [15:32:01.511] args[[name]] <- ...future.oldEnvVars[[name]] [15:32:01.511] } [15:32:01.511] NAMES <- toupper(added) [15:32:01.511] for (kk in seq_along(NAMES)) { [15:32:01.511] name <- added[[kk]] [15:32:01.511] NAME <- NAMES[[kk]] [15:32:01.511] if (name != NAME && is.element(NAME, old_names)) [15:32:01.511] next [15:32:01.511] args[[name]] <- "" [15:32:01.511] } [15:32:01.511] NAMES <- toupper(removed) [15:32:01.511] for (kk in seq_along(NAMES)) { [15:32:01.511] name <- removed[[kk]] [15:32:01.511] NAME <- NAMES[[kk]] [15:32:01.511] if (name != NAME && is.element(NAME, old_names)) [15:32:01.511] next [15:32:01.511] args[[name]] <- ...future.oldEnvVars[[name]] [15:32:01.511] } [15:32:01.511] if (length(args) > 0) [15:32:01.511] base::do.call(base::Sys.setenv, args = args) [15:32:01.511] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:32:01.511] } [15:32:01.511] else { [15:32:01.511] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:32:01.511] } [15:32:01.511] { [15:32:01.511] if (base::length(...future.futureOptionsAdded) > [15:32:01.511] 0L) { [15:32:01.511] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:32:01.511] base::names(opts) <- ...future.futureOptionsAdded [15:32:01.511] base::options(opts) [15:32:01.511] } [15:32:01.511] { [15:32:01.511] { [15:32:01.511] base::options(mc.cores = ...future.mc.cores.old) [15:32:01.511] NULL [15:32:01.511] } [15:32:01.511] options(future.plan = NULL) [15:32:01.511] if (is.na(NA_character_)) [15:32:01.511] Sys.unsetenv("R_FUTURE_PLAN") [15:32:01.511] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:32:01.511] future::plan(...future.strategy.old, .cleanup = FALSE, [15:32:01.511] .init = FALSE) [15:32:01.511] } [15:32:01.511] } [15:32:01.511] } [15:32:01.511] }) [15:32:01.511] if (TRUE) { [15:32:01.511] base::sink(type = "output", split = FALSE) [15:32:01.511] if (TRUE) { [15:32:01.511] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:32:01.511] } [15:32:01.511] else { [15:32:01.511] ...future.result["stdout"] <- base::list(NULL) [15:32:01.511] } [15:32:01.511] base::close(...future.stdout) [15:32:01.511] ...future.stdout <- NULL [15:32:01.511] } [15:32:01.511] ...future.result$conditions <- ...future.conditions [15:32:01.511] ...future.result$finished <- base::Sys.time() [15:32:01.511] ...future.result [15:32:01.511] } [15:32:01.518] Exporting 5 global objects (848 bytes) to cluster node #1 ... [15:32:01.519] Exporting '...future.FUN' (848 bytes) to cluster node #1 ... [15:32:01.519] Exporting '...future.FUN' (848 bytes) to cluster node #1 ... DONE [15:32:01.520] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [15:32:01.521] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [15:32:01.521] Exporting '...future.elements_ii' (56 bytes) to cluster node #1 ... [15:32:01.522] Exporting '...future.elements_ii' (56 bytes) to cluster node #1 ... DONE [15:32:01.522] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:32:01.523] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:32:01.523] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:32:01.523] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:32:01.524] Exporting 5 global objects (848 bytes) to cluster node #1 ... DONE [15:32:01.524] MultisessionFuture started [15:32:01.525] - Launch lazy future ... done [15:32:01.525] run() for 'MultisessionFuture' ... done [15:32:01.525] Created future: [15:32:01.556] receiveMessageFromWorker() for ClusterFuture ... [15:32:01.556] - Validating connection of MultisessionFuture [15:32:01.557] - received message: FutureResult [15:32:01.557] - Received FutureResult [15:32:01.558] - Erased future from FutureRegistry [15:32:01.558] result() for ClusterFuture ... [15:32:01.558] - result already collected: FutureResult [15:32:01.559] result() for ClusterFuture ... done [15:32:01.559] receiveMessageFromWorker() for ClusterFuture ... done [15:32:01.526] MultisessionFuture: [15:32:01.526] Label: 'future_lapply-1' [15:32:01.526] Expression: [15:32:01.526] { [15:32:01.526] do.call(function(...) { [15:32:01.526] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:01.526] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:32:01.526] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:01.526] on.exit(options(oopts), add = TRUE) [15:32:01.526] } [15:32:01.526] { [15:32:01.526] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:32:01.526] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:01.526] ...future.FUN(...future.X_jj, ...) [15:32:01.526] }) [15:32:01.526] } [15:32:01.526] }, args = future.call.arguments) [15:32:01.526] } [15:32:01.526] Lazy evaluation: FALSE [15:32:01.526] Asynchronous evaluation: TRUE [15:32:01.526] Local evaluation: TRUE [15:32:01.526] Environment: R_GlobalEnv [15:32:01.526] Capture standard output: TRUE [15:32:01.526] Capture condition classes: 'condition' (excluding 'nothing') [15:32:01.526] Globals: 5 objects totaling 904 bytes (function '...future.FUN' of 848 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 56 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:32:01.526] Packages: [15:32:01.526] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:32:01.526] Resolved: TRUE [15:32:01.526] Value: [15:32:01.526] Conditions captured: [15:32:01.526] Early signaling: FALSE [15:32:01.526] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:32:01.526] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:32:01.560] Chunk #1 of 2 ... DONE [15:32:01.560] Chunk #2 of 2 ... [15:32:01.560] - Finding globals in 'X' for chunk #2 ... [15:32:01.560] getGlobalsAndPackages() ... [15:32:01.560] Searching for globals... [15:32:01.561] [15:32:01.561] Searching for globals ... DONE [15:32:01.561] - globals: [0] [15:32:01.561] getGlobalsAndPackages() ... DONE [15:32:01.562] + additional globals found: [n=0] [15:32:01.562] + additional namespaces needed: [n=0] [15:32:01.562] - Finding globals in 'X' for chunk #2 ... DONE [15:32:01.562] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [15:32:01.562] - seeds: [15:32:01.563] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:01.563] getGlobalsAndPackages() ... [15:32:01.563] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:01.563] Resolving globals: FALSE [15:32:01.564] Tweak future expression to call with '...' arguments ... [15:32:01.564] { [15:32:01.564] do.call(function(...) { [15:32:01.564] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:01.564] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:32:01.564] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:01.564] on.exit(options(oopts), add = TRUE) [15:32:01.564] } [15:32:01.564] { [15:32:01.564] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:32:01.564] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:01.564] ...future.FUN(...future.X_jj, ...) [15:32:01.564] }) [15:32:01.564] } [15:32:01.564] }, args = future.call.arguments) [15:32:01.564] } [15:32:01.564] Tweak future expression to call with '...' arguments ... DONE [15:32:01.565] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [15:32:01.565] [15:32:01.565] getGlobalsAndPackages() ... DONE [15:32:01.566] run() for 'Future' ... [15:32:01.566] - state: 'created' [15:32:01.566] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [15:32:01.584] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:32:01.584] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [15:32:01.585] - Field: 'node' [15:32:01.585] - Field: 'label' [15:32:01.585] - Field: 'local' [15:32:01.586] - Field: 'owner' [15:32:01.586] - Field: 'envir' [15:32:01.586] - Field: 'workers' [15:32:01.587] - Field: 'packages' [15:32:01.587] - Field: 'gc' [15:32:01.587] - Field: 'conditions' [15:32:01.588] - Field: 'persistent' [15:32:01.588] - Field: 'expr' [15:32:01.589] - Field: 'uuid' [15:32:01.589] - Field: 'seed' [15:32:01.589] - Field: 'version' [15:32:01.590] - Field: 'result' [15:32:01.590] - Field: 'asynchronous' [15:32:01.590] - Field: 'calls' [15:32:01.591] - Field: 'globals' [15:32:01.591] - Field: 'stdout' [15:32:01.591] - Field: 'earlySignal' [15:32:01.592] - Field: 'lazy' [15:32:01.592] - Field: 'state' [15:32:01.593] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [15:32:01.593] - Launch lazy future ... [15:32:01.594] Packages needed by the future expression (n = 0): [15:32:01.594] Packages needed by future strategies (n = 0): [15:32:01.595] { [15:32:01.595] { [15:32:01.595] { [15:32:01.595] ...future.startTime <- base::Sys.time() [15:32:01.595] { [15:32:01.595] { [15:32:01.595] { [15:32:01.595] { [15:32:01.595] base::local({ [15:32:01.595] has_future <- base::requireNamespace("future", [15:32:01.595] quietly = TRUE) [15:32:01.595] if (has_future) { [15:32:01.595] ns <- base::getNamespace("future") [15:32:01.595] version <- ns[[".package"]][["version"]] [15:32:01.595] if (is.null(version)) [15:32:01.595] version <- utils::packageVersion("future") [15:32:01.595] } [15:32:01.595] else { [15:32:01.595] version <- NULL [15:32:01.595] } [15:32:01.595] if (!has_future || version < "1.8.0") { [15:32:01.595] info <- base::c(r_version = base::gsub("R version ", [15:32:01.595] "", base::R.version$version.string), [15:32:01.595] platform = base::sprintf("%s (%s-bit)", [15:32:01.595] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [15:32:01.595] os = base::paste(base::Sys.info()[base::c("sysname", [15:32:01.595] "release", "version")], collapse = " "), [15:32:01.595] hostname = base::Sys.info()[["nodename"]]) [15:32:01.595] info <- base::sprintf("%s: %s", base::names(info), [15:32:01.595] info) [15:32:01.595] info <- base::paste(info, collapse = "; ") [15:32:01.595] if (!has_future) { [15:32:01.595] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [15:32:01.595] info) [15:32:01.595] } [15:32:01.595] else { [15:32:01.595] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [15:32:01.595] info, version) [15:32:01.595] } [15:32:01.595] base::stop(msg) [15:32:01.595] } [15:32:01.595] }) [15:32:01.595] } [15:32:01.595] ...future.mc.cores.old <- base::getOption("mc.cores") [15:32:01.595] base::options(mc.cores = 1L) [15:32:01.595] } [15:32:01.595] ...future.strategy.old <- future::plan("list") [15:32:01.595] options(future.plan = NULL) [15:32:01.595] Sys.unsetenv("R_FUTURE_PLAN") [15:32:01.595] future::plan("default", .cleanup = FALSE, .init = FALSE) [15:32:01.595] } [15:32:01.595] ...future.workdir <- getwd() [15:32:01.595] } [15:32:01.595] ...future.oldOptions <- base::as.list(base::.Options) [15:32:01.595] ...future.oldEnvVars <- base::Sys.getenv() [15:32:01.595] } [15:32:01.595] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [15:32:01.595] future.globals.maxSize = 1048576000, future.globals.method = NULL, [15:32:01.595] future.globals.onMissing = NULL, future.globals.onReference = NULL, [15:32:01.595] future.globals.resolve = NULL, future.resolve.recursive = NULL, [15:32:01.595] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [15:32:01.595] future.stdout.windows.reencode = NULL, width = 80L) [15:32:01.595] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [15:32:01.595] base::names(...future.oldOptions)) [15:32:01.595] } [15:32:01.595] if (FALSE) { [15:32:01.595] } [15:32:01.595] else { [15:32:01.595] if (TRUE) { [15:32:01.595] ...future.stdout <- base::rawConnection(base::raw(0L), [15:32:01.595] open = "w") [15:32:01.595] } [15:32:01.595] else { [15:32:01.595] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [15:32:01.595] windows = "NUL", "/dev/null"), open = "w") [15:32:01.595] } [15:32:01.595] base::sink(...future.stdout, type = "output", split = FALSE) [15:32:01.595] base::on.exit(if (!base::is.null(...future.stdout)) { [15:32:01.595] base::sink(type = "output", split = FALSE) [15:32:01.595] base::close(...future.stdout) [15:32:01.595] }, add = TRUE) [15:32:01.595] } [15:32:01.595] ...future.frame <- base::sys.nframe() [15:32:01.595] ...future.conditions <- base::list() [15:32:01.595] ...future.rng <- base::globalenv()$.Random.seed [15:32:01.595] if (FALSE) { [15:32:01.595] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [15:32:01.595] "...future.value", "...future.globalenv.names", ".Random.seed") [15:32:01.595] } [15:32:01.595] ...future.result <- base::tryCatch({ [15:32:01.595] base::withCallingHandlers({ [15:32:01.595] ...future.value <- base::withVisible(base::local({ [15:32:01.595] ...future.makeSendCondition <- base::local({ [15:32:01.595] sendCondition <- NULL [15:32:01.595] function(frame = 1L) { [15:32:01.595] if (is.function(sendCondition)) [15:32:01.595] return(sendCondition) [15:32:01.595] ns <- getNamespace("parallel") [15:32:01.595] if (exists("sendData", mode = "function", [15:32:01.595] envir = ns)) { [15:32:01.595] parallel_sendData <- get("sendData", mode = "function", [15:32:01.595] envir = ns) [15:32:01.595] envir <- sys.frame(frame) [15:32:01.595] master <- NULL [15:32:01.595] while (!identical(envir, .GlobalEnv) && [15:32:01.595] !identical(envir, emptyenv())) { [15:32:01.595] if (exists("master", mode = "list", envir = envir, [15:32:01.595] inherits = FALSE)) { [15:32:01.595] master <- get("master", mode = "list", [15:32:01.595] envir = envir, inherits = FALSE) [15:32:01.595] if (inherits(master, c("SOCKnode", [15:32:01.595] "SOCK0node"))) { [15:32:01.595] sendCondition <<- function(cond) { [15:32:01.595] data <- list(type = "VALUE", value = cond, [15:32:01.595] success = TRUE) [15:32:01.595] parallel_sendData(master, data) [15:32:01.595] } [15:32:01.595] return(sendCondition) [15:32:01.595] } [15:32:01.595] } [15:32:01.595] frame <- frame + 1L [15:32:01.595] envir <- sys.frame(frame) [15:32:01.595] } [15:32:01.595] } [15:32:01.595] sendCondition <<- function(cond) NULL [15:32:01.595] } [15:32:01.595] }) [15:32:01.595] withCallingHandlers({ [15:32:01.595] { [15:32:01.595] do.call(function(...) { [15:32:01.595] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:01.595] if (!identical(...future.globals.maxSize.org, [15:32:01.595] ...future.globals.maxSize)) { [15:32:01.595] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:01.595] on.exit(options(oopts), add = TRUE) [15:32:01.595] } [15:32:01.595] { [15:32:01.595] lapply(seq_along(...future.elements_ii), [15:32:01.595] FUN = function(jj) { [15:32:01.595] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:01.595] ...future.FUN(...future.X_jj, ...) [15:32:01.595] }) [15:32:01.595] } [15:32:01.595] }, args = future.call.arguments) [15:32:01.595] } [15:32:01.595] }, immediateCondition = function(cond) { [15:32:01.595] sendCondition <- ...future.makeSendCondition() [15:32:01.595] sendCondition(cond) [15:32:01.595] muffleCondition <- function (cond, pattern = "^muffle") [15:32:01.595] { [15:32:01.595] inherits <- base::inherits [15:32:01.595] invokeRestart <- base::invokeRestart [15:32:01.595] is.null <- base::is.null [15:32:01.595] muffled <- FALSE [15:32:01.595] if (inherits(cond, "message")) { [15:32:01.595] muffled <- grepl(pattern, "muffleMessage") [15:32:01.595] if (muffled) [15:32:01.595] invokeRestart("muffleMessage") [15:32:01.595] } [15:32:01.595] else if (inherits(cond, "warning")) { [15:32:01.595] muffled <- grepl(pattern, "muffleWarning") [15:32:01.595] if (muffled) [15:32:01.595] invokeRestart("muffleWarning") [15:32:01.595] } [15:32:01.595] else if (inherits(cond, "condition")) { [15:32:01.595] if (!is.null(pattern)) { [15:32:01.595] computeRestarts <- base::computeRestarts [15:32:01.595] grepl <- base::grepl [15:32:01.595] restarts <- computeRestarts(cond) [15:32:01.595] for (restart in restarts) { [15:32:01.595] name <- restart$name [15:32:01.595] if (is.null(name)) [15:32:01.595] next [15:32:01.595] if (!grepl(pattern, name)) [15:32:01.595] next [15:32:01.595] invokeRestart(restart) [15:32:01.595] muffled <- TRUE [15:32:01.595] break [15:32:01.595] } [15:32:01.595] } [15:32:01.595] } [15:32:01.595] invisible(muffled) [15:32:01.595] } [15:32:01.595] muffleCondition(cond) [15:32:01.595] }) [15:32:01.595] })) [15:32:01.595] future::FutureResult(value = ...future.value$value, [15:32:01.595] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [15:32:01.595] ...future.rng), globalenv = if (FALSE) [15:32:01.595] list(added = base::setdiff(base::names(base::.GlobalEnv), [15:32:01.595] ...future.globalenv.names)) [15:32:01.595] else NULL, started = ...future.startTime, version = "1.8") [15:32:01.595] }, condition = base::local({ [15:32:01.595] c <- base::c [15:32:01.595] inherits <- base::inherits [15:32:01.595] invokeRestart <- base::invokeRestart [15:32:01.595] length <- base::length [15:32:01.595] list <- base::list [15:32:01.595] seq.int <- base::seq.int [15:32:01.595] signalCondition <- base::signalCondition [15:32:01.595] sys.calls <- base::sys.calls [15:32:01.595] `[[` <- base::`[[` [15:32:01.595] `+` <- base::`+` [15:32:01.595] `<<-` <- base::`<<-` [15:32:01.595] sysCalls <- function(calls = sys.calls(), from = 1L) { [15:32:01.595] calls[seq.int(from = from + 12L, to = length(calls) - [15:32:01.595] 3L)] [15:32:01.595] } [15:32:01.595] function(cond) { [15:32:01.595] is_error <- inherits(cond, "error") [15:32:01.595] ignore <- !is_error && !is.null(NULL) && inherits(cond, [15:32:01.595] NULL) [15:32:01.595] if (is_error) { [15:32:01.595] sessionInformation <- function() { [15:32:01.595] list(r = base::R.Version(), locale = base::Sys.getlocale(), [15:32:01.595] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [15:32:01.595] search = base::search(), system = base::Sys.info()) [15:32:01.595] } [15:32:01.595] ...future.conditions[[length(...future.conditions) + [15:32:01.595] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [15:32:01.595] cond$call), session = sessionInformation(), [15:32:01.595] timestamp = base::Sys.time(), signaled = 0L) [15:32:01.595] signalCondition(cond) [15:32:01.595] } [15:32:01.595] else if (!ignore && TRUE && inherits(cond, c("condition", [15:32:01.595] "immediateCondition"))) { [15:32:01.595] signal <- TRUE && inherits(cond, "immediateCondition") [15:32:01.595] ...future.conditions[[length(...future.conditions) + [15:32:01.595] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [15:32:01.595] if (TRUE && !signal) { [15:32:01.595] muffleCondition <- function (cond, pattern = "^muffle") [15:32:01.595] { [15:32:01.595] inherits <- base::inherits [15:32:01.595] invokeRestart <- base::invokeRestart [15:32:01.595] is.null <- base::is.null [15:32:01.595] muffled <- FALSE [15:32:01.595] if (inherits(cond, "message")) { [15:32:01.595] muffled <- grepl(pattern, "muffleMessage") [15:32:01.595] if (muffled) [15:32:01.595] invokeRestart("muffleMessage") [15:32:01.595] } [15:32:01.595] else if (inherits(cond, "warning")) { [15:32:01.595] muffled <- grepl(pattern, "muffleWarning") [15:32:01.595] if (muffled) [15:32:01.595] invokeRestart("muffleWarning") [15:32:01.595] } [15:32:01.595] else if (inherits(cond, "condition")) { [15:32:01.595] if (!is.null(pattern)) { [15:32:01.595] computeRestarts <- base::computeRestarts [15:32:01.595] grepl <- base::grepl [15:32:01.595] restarts <- computeRestarts(cond) [15:32:01.595] for (restart in restarts) { [15:32:01.595] name <- restart$name [15:32:01.595] if (is.null(name)) [15:32:01.595] next [15:32:01.595] if (!grepl(pattern, name)) [15:32:01.595] next [15:32:01.595] invokeRestart(restart) [15:32:01.595] muffled <- TRUE [15:32:01.595] break [15:32:01.595] } [15:32:01.595] } [15:32:01.595] } [15:32:01.595] invisible(muffled) [15:32:01.595] } [15:32:01.595] muffleCondition(cond, pattern = "^muffle") [15:32:01.595] } [15:32:01.595] } [15:32:01.595] else { [15:32:01.595] if (TRUE) { [15:32:01.595] muffleCondition <- function (cond, pattern = "^muffle") [15:32:01.595] { [15:32:01.595] inherits <- base::inherits [15:32:01.595] invokeRestart <- base::invokeRestart [15:32:01.595] is.null <- base::is.null [15:32:01.595] muffled <- FALSE [15:32:01.595] if (inherits(cond, "message")) { [15:32:01.595] muffled <- grepl(pattern, "muffleMessage") [15:32:01.595] if (muffled) [15:32:01.595] invokeRestart("muffleMessage") [15:32:01.595] } [15:32:01.595] else if (inherits(cond, "warning")) { [15:32:01.595] muffled <- grepl(pattern, "muffleWarning") [15:32:01.595] if (muffled) [15:32:01.595] invokeRestart("muffleWarning") [15:32:01.595] } [15:32:01.595] else if (inherits(cond, "condition")) { [15:32:01.595] if (!is.null(pattern)) { [15:32:01.595] computeRestarts <- base::computeRestarts [15:32:01.595] grepl <- base::grepl [15:32:01.595] restarts <- computeRestarts(cond) [15:32:01.595] for (restart in restarts) { [15:32:01.595] name <- restart$name [15:32:01.595] if (is.null(name)) [15:32:01.595] next [15:32:01.595] if (!grepl(pattern, name)) [15:32:01.595] next [15:32:01.595] invokeRestart(restart) [15:32:01.595] muffled <- TRUE [15:32:01.595] break [15:32:01.595] } [15:32:01.595] } [15:32:01.595] } [15:32:01.595] invisible(muffled) [15:32:01.595] } [15:32:01.595] muffleCondition(cond, pattern = "^muffle") [15:32:01.595] } [15:32:01.595] } [15:32:01.595] } [15:32:01.595] })) [15:32:01.595] }, error = function(ex) { [15:32:01.595] base::structure(base::list(value = NULL, visible = NULL, [15:32:01.595] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [15:32:01.595] ...future.rng), started = ...future.startTime, [15:32:01.595] finished = Sys.time(), session_uuid = NA_character_, [15:32:01.595] version = "1.8"), class = "FutureResult") [15:32:01.595] }, finally = { [15:32:01.595] if (!identical(...future.workdir, getwd())) [15:32:01.595] setwd(...future.workdir) [15:32:01.595] { [15:32:01.595] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [15:32:01.595] ...future.oldOptions$nwarnings <- NULL [15:32:01.595] } [15:32:01.595] base::options(...future.oldOptions) [15:32:01.595] if (.Platform$OS.type == "windows") { [15:32:01.595] old_names <- names(...future.oldEnvVars) [15:32:01.595] envs <- base::Sys.getenv() [15:32:01.595] names <- names(envs) [15:32:01.595] common <- intersect(names, old_names) [15:32:01.595] added <- setdiff(names, old_names) [15:32:01.595] removed <- setdiff(old_names, names) [15:32:01.595] changed <- common[...future.oldEnvVars[common] != [15:32:01.595] envs[common]] [15:32:01.595] NAMES <- toupper(changed) [15:32:01.595] args <- list() [15:32:01.595] for (kk in seq_along(NAMES)) { [15:32:01.595] name <- changed[[kk]] [15:32:01.595] NAME <- NAMES[[kk]] [15:32:01.595] if (name != NAME && is.element(NAME, old_names)) [15:32:01.595] next [15:32:01.595] args[[name]] <- ...future.oldEnvVars[[name]] [15:32:01.595] } [15:32:01.595] NAMES <- toupper(added) [15:32:01.595] for (kk in seq_along(NAMES)) { [15:32:01.595] name <- added[[kk]] [15:32:01.595] NAME <- NAMES[[kk]] [15:32:01.595] if (name != NAME && is.element(NAME, old_names)) [15:32:01.595] next [15:32:01.595] args[[name]] <- "" [15:32:01.595] } [15:32:01.595] NAMES <- toupper(removed) [15:32:01.595] for (kk in seq_along(NAMES)) { [15:32:01.595] name <- removed[[kk]] [15:32:01.595] NAME <- NAMES[[kk]] [15:32:01.595] if (name != NAME && is.element(NAME, old_names)) [15:32:01.595] next [15:32:01.595] args[[name]] <- ...future.oldEnvVars[[name]] [15:32:01.595] } [15:32:01.595] if (length(args) > 0) [15:32:01.595] base::do.call(base::Sys.setenv, args = args) [15:32:01.595] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [15:32:01.595] } [15:32:01.595] else { [15:32:01.595] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [15:32:01.595] } [15:32:01.595] { [15:32:01.595] if (base::length(...future.futureOptionsAdded) > [15:32:01.595] 0L) { [15:32:01.595] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [15:32:01.595] base::names(opts) <- ...future.futureOptionsAdded [15:32:01.595] base::options(opts) [15:32:01.595] } [15:32:01.595] { [15:32:01.595] { [15:32:01.595] base::options(mc.cores = ...future.mc.cores.old) [15:32:01.595] NULL [15:32:01.595] } [15:32:01.595] options(future.plan = NULL) [15:32:01.595] if (is.na(NA_character_)) [15:32:01.595] Sys.unsetenv("R_FUTURE_PLAN") [15:32:01.595] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [15:32:01.595] future::plan(...future.strategy.old, .cleanup = FALSE, [15:32:01.595] .init = FALSE) [15:32:01.595] } [15:32:01.595] } [15:32:01.595] } [15:32:01.595] }) [15:32:01.595] if (TRUE) { [15:32:01.595] base::sink(type = "output", split = FALSE) [15:32:01.595] if (TRUE) { [15:32:01.595] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [15:32:01.595] } [15:32:01.595] else { [15:32:01.595] ...future.result["stdout"] <- base::list(NULL) [15:32:01.595] } [15:32:01.595] base::close(...future.stdout) [15:32:01.595] ...future.stdout <- NULL [15:32:01.595] } [15:32:01.595] ...future.result$conditions <- ...future.conditions [15:32:01.595] ...future.result$finished <- base::Sys.time() [15:32:01.595] ...future.result [15:32:01.595] } [15:32:01.606] Exporting 5 global objects (848 bytes) to cluster node #1 ... [15:32:01.606] Exporting '...future.FUN' (848 bytes) to cluster node #1 ... [15:32:01.607] Exporting '...future.FUN' (848 bytes) to cluster node #1 ... DONE [15:32:01.608] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [15:32:01.608] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [15:32:01.609] Exporting '...future.elements_ii' (56 bytes) to cluster node #1 ... [15:32:01.609] Exporting '...future.elements_ii' (56 bytes) to cluster node #1 ... DONE [15:32:01.609] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [15:32:01.610] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [15:32:01.610] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [15:32:01.611] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [15:32:01.611] Exporting 5 global objects (848 bytes) to cluster node #1 ... DONE [15:32:01.612] MultisessionFuture started [15:32:01.612] - Launch lazy future ... done [15:32:01.613] run() for 'MultisessionFuture' ... done [15:32:01.613] Created future: [15:32:01.641] receiveMessageFromWorker() for ClusterFuture ... [15:32:01.641] - Validating connection of MultisessionFuture [15:32:01.642] - received message: FutureResult [15:32:01.642] - Received FutureResult [15:32:01.642] - Erased future from FutureRegistry [15:32:01.643] result() for ClusterFuture ... [15:32:01.643] - result already collected: FutureResult [15:32:01.643] result() for ClusterFuture ... done [15:32:01.644] receiveMessageFromWorker() for ClusterFuture ... done [15:32:01.613] MultisessionFuture: [15:32:01.613] Label: 'future_lapply-2' [15:32:01.613] Expression: [15:32:01.613] { [15:32:01.613] do.call(function(...) { [15:32:01.613] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [15:32:01.613] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [15:32:01.613] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [15:32:01.613] on.exit(options(oopts), add = TRUE) [15:32:01.613] } [15:32:01.613] { [15:32:01.613] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [15:32:01.613] ...future.X_jj <- ...future.elements_ii[[jj]] [15:32:01.613] ...future.FUN(...future.X_jj, ...) [15:32:01.613] }) [15:32:01.613] } [15:32:01.613] }, args = future.call.arguments) [15:32:01.613] } [15:32:01.613] Lazy evaluation: FALSE [15:32:01.613] Asynchronous evaluation: TRUE [15:32:01.613] Local evaluation: TRUE [15:32:01.613] Environment: R_GlobalEnv [15:32:01.613] Capture standard output: TRUE [15:32:01.613] Capture condition classes: 'condition' (excluding 'nothing') [15:32:01.613] Globals: 5 objects totaling 904 bytes (function '...future.FUN' of 848 bytes, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 56 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [15:32:01.613] Packages: [15:32:01.613] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [15:32:01.613] Resolved: TRUE [15:32:01.613] Value: [15:32:01.613] Conditions captured: [15:32:01.613] Early signaling: FALSE [15:32:01.613] Owner process: c7f938d9-55dc-c88a-8125-12936c92cabb [15:32:01.613] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [15:32:01.644] Chunk #2 of 2 ... DONE [15:32:01.645] Launching 2 futures (chunks) ... DONE [15:32:01.645] Resolving 2 futures (chunks) ... [15:32:01.645] resolve() on list ... [15:32:01.646] recursive: 0 [15:32:01.646] length: 2 [15:32:01.646] [15:32:01.646] Future #1 [15:32:01.647] result() for ClusterFuture ... [15:32:01.647] - result already collected: FutureResult [15:32:01.647] result() for ClusterFuture ... done [15:32:01.648] result() for ClusterFuture ... [15:32:01.648] - result already collected: FutureResult [15:32:01.648] result() for ClusterFuture ... done [15:32:01.649] signalConditionsASAP(MultisessionFuture, pos=1) ... [15:32:01.649] - nx: 2 [15:32:01.649] - relay: TRUE [15:32:01.649] - stdout: TRUE [15:32:01.650] - signal: TRUE [15:32:01.650] - resignal: FALSE [15:32:01.650] - force: TRUE [15:32:01.650] - relayed: [n=2] FALSE, FALSE [15:32:01.651] - queued futures: [n=2] FALSE, FALSE [15:32:01.651] - until=1 [15:32:01.651] - relaying element #1 [15:32:01.652] result() for ClusterFuture ... [15:32:01.652] - result already collected: FutureResult [15:32:01.652] result() for ClusterFuture ... done [15:32:01.652] result() for ClusterFuture ... [15:32:01.653] - result already collected: FutureResult [15:32:01.653] result() for ClusterFuture ... done [15:32:01.653] result() for ClusterFuture ... [15:32:01.654] - result already collected: FutureResult [15:32:01.654] result() for ClusterFuture ... done [15:32:01.654] result() for ClusterFuture ... [15:32:01.655] - result already collected: FutureResult [15:32:01.655] result() for ClusterFuture ... done [15:32:01.655] - relayed: [n=2] TRUE, FALSE [15:32:01.656] - queued futures: [n=2] TRUE, FALSE [15:32:01.656] signalConditionsASAP(MultisessionFuture, pos=1) ... done [15:32:01.657] length: 1 (resolved future 1) [15:32:01.657] Future #2 [15:32:01.657] result() for ClusterFuture ... [15:32:01.658] - result already collected: FutureResult [15:32:01.658] result() for ClusterFuture ... done [15:32:01.658] result() for ClusterFuture ... [15:32:01.659] - result already collected: FutureResult [15:32:01.659] result() for ClusterFuture ... done [15:32:01.659] signalConditionsASAP(MultisessionFuture, pos=2) ... [15:32:01.659] - nx: 2 [15:32:01.660] - relay: TRUE [15:32:01.660] - stdout: TRUE [15:32:01.660] - signal: TRUE [15:32:01.661] - resignal: FALSE [15:32:01.661] - force: TRUE [15:32:01.661] - relayed: [n=2] TRUE, FALSE [15:32:01.661] - queued futures: [n=2] TRUE, FALSE [15:32:01.662] - until=2 [15:32:01.662] - relaying element #2 [15:32:01.662] result() for ClusterFuture ... [15:32:01.663] - result already collected: FutureResult [15:32:01.663] result() for ClusterFuture ... done [15:32:01.663] result() for ClusterFuture ... [15:32:01.663] - result already collected: FutureResult [15:32:01.664] result() for ClusterFuture ... done [15:32:01.664] result() for ClusterFuture ... [15:32:01.664] - result already collected: FutureResult [15:32:01.665] result() for ClusterFuture ... done [15:32:01.665] result() for ClusterFuture ... [15:32:01.665] - result already collected: FutureResult [15:32:01.666] result() for ClusterFuture ... done [15:32:01.666] - relayed: [n=2] TRUE, TRUE [15:32:01.666] - queued futures: [n=2] TRUE, TRUE [15:32:01.667] signalConditionsASAP(MultisessionFuture, pos=2) ... done [15:32:01.667] length: 0 (resolved future 2) [15:32:01.667] Relaying remaining futures [15:32:01.668] signalConditionsASAP(NULL, pos=0) ... [15:32:01.668] - nx: 2 [15:32:01.668] - relay: TRUE [15:32:01.668] - stdout: TRUE [15:32:01.669] - signal: TRUE [15:32:01.669] - resignal: FALSE [15:32:01.669] - force: TRUE [15:32:01.670] - relayed: [n=2] TRUE, TRUE [15:32:01.670] - queued futures: [n=2] TRUE, TRUE - flush all [15:32:01.670] - relayed: [n=2] TRUE, TRUE [15:32:01.671] - queued futures: [n=2] TRUE, TRUE [15:32:01.671] signalConditionsASAP(NULL, pos=0) ... done [15:32:01.671] resolve() on list ... DONE [15:32:01.672] result() for ClusterFuture ... [15:32:01.672] - result already collected: FutureResult [15:32:01.672] result() for ClusterFuture ... done [15:32:01.673] result() for ClusterFuture ... [15:32:01.673] - result already collected: FutureResult [15:32:01.673] result() for ClusterFuture ... done [15:32:01.674] result() for ClusterFuture ... [15:32:01.674] - result already collected: FutureResult [15:32:01.674] result() for ClusterFuture ... done [15:32:01.675] result() for ClusterFuture ... [15:32:01.675] - result already collected: FutureResult [15:32:01.675] result() for ClusterFuture ... done [15:32:01.676] - Number of value chunks collected: 2 [15:32:01.676] Resolving 2 futures (chunks) ... DONE [15:32:01.676] Reducing values from 2 chunks ... [15:32:01.677] - Number of values collected after concatenation: 2 [15:32:01.677] - Number of values expected: 2 [15:32:01.677] Reducing values from 2 chunks ... DONE [15:32:01.677] 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) [15:32:01.679] 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") [15:32:01.687] plan(): Setting new future strategy stack: [15:32:01.687] List of future strategies: [15:32:01.687] 1. FutureStrategy: [15:32:01.687] - args: function (..., envir = parent.frame(), workers = "") [15:32:01.687] - tweaked: FALSE [15:32:01.687] - call: future::plan(oplan) [15:32:01.689] plan(): nbrOfWorkers() = 1 > > proc.time() user system elapsed 14.79 0.57 17.48